#############################################
### 0. LOAD LIBRARIES & DATA
#############################################
library(dplyr)
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
library(tidyr)
library(tidygeocoder)
## Warning: package 'tidygeocoder' was built under R version 4.5.2
library(geodist)
## Warning: package 'geodist' was built under R version 4.5.2
library(factoextra)
## Loading required package: ggplot2
## Welcome! Want to learn more? See two factoextra-related books at https://goo.gl/ve3WBa
# Load the cleaned dataset
ryanair_clean <- read.csv("ryanair_reviews_cleaned.csv")
#############################################
### 1. GEOCODE ORIGIN & DESTINATION
#############################################
# Extract unique cities
locations <- ryanair_clean %>%
select(Origin, Destination) %>%
pivot_longer(cols = everything(), values_to = "City") %>%
distinct(City)
# Geocode using OpenStreetMap (free)
coords <- locations %>%
geocode(City, method = "osm") %>%
rename(lat = lat, lon = long)
## Passing 440 addresses to the Nominatim single address geocoder
## Query completed in: 449.4 seconds
ryanair_clean <- ryanair_clean %>%
select(-matches("lat_origin|lon_origin|lat_dest|lon_dest"))
# Join origin coords
ryanair_clean <- ryanair_clean %>%
left_join(coords, by = c("Origin" = "City")) %>%
rename(lat_origin = lat, lon_origin = lon)
# Join destination coords
ryanair_clean <- ryanair_clean %>%
left_join(coords, by = c("Destination" = "City")) %>%
rename(lat_dest = lat, lon_dest = lon)
#############################################
### 2. COMPUTE DISTANCE + DURATION
#############################################
# Compute geodesic distance row-by-row
ryanair_clean <- ryanair_clean %>%
rowwise() %>%
mutate(
distance_km = as.numeric(
geodist(
x = c(lon_origin, lat_origin),
y = c(lon_dest, lat_dest),
measure = "geodesic"
) / 1000
),
duration_hr = distance_km / 800 # Ryanair average speed ~800 km/h
) %>%
ungroup()
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
## object has no named columns; assuming order is lon then lat
# Remove rows with missing duration
ryanair_clean <- ryanair_clean %>% filter(!is.na(duration_hr))
#############################################
### 3. CREATE ENGINEERED FEATURES
#############################################
ryanair_features <- ryanair_clean %>%
mutate(
# Price perception
Price = Value.For.Money,
# Seat comfort
Comfortability = Seat.Comfort,
# Combine staff-related services
StaffService = (Cabin.Staff.Service + Ground.Service) / 2,
# Extra services experience
ExtraServices = (Food...Beverages +
Inflight.Entertainment +
Wifi...Connectivity) / 3
)
#############################################
### 4. CATEGORIZE FLIGHT DURATION
#############################################
ryanair_features <- ryanair_features %>%
mutate(
DurationCat = case_when(
duration_hr < 2 ~ "Short",
duration_hr >= 2 & duration_hr <= 3.5 ~ "Medium",
duration_hr > 3.5 ~ "Long",
TRUE ~ "Unknown"
)
)
# One-hot encode duration category
duration_dummy <- model.matrix(~ DurationCat - 1, data = ryanair_features) %>%
as.data.frame()
ryanair_features <- cbind(ryanair_features, duration_dummy)
#############################################
### 5. BUILD FINAL CLUSTERING DATASET
#############################################
clustering_data <- ryanair_features %>%
select(
Price,
Comfortability,
StaffService,
ExtraServices,
DurationCatShort,
DurationCatMedium,
DurationCatLong
) %>%
replace(is.na(.), 0)
#############################################
### 6. SCALE DATA
#############################################
clustering_scaled <- scale(clustering_data)
#############################################
### 7. DETERMINE OPTIMAL K (Elbow + Silhouette)
#############################################
# Elbow
fviz_nbclust(clustering_scaled, kmeans, method = "wss", k.max = 10)
# Silhouette
fviz_nbclust(clustering_scaled, kmeans, method = "silhouette", k.max = 10)
#############################################
### 8. FINAL K-MEANS WITH k = 5
#############################################
set.seed(123)
k_final <- 5
cluster_model <- kmeans(clustering_scaled, centers = k_final, nstart = 30)
ryanair_features$cluster_new <- cluster_model$cluster
ryanair_features
## X Date.Published Overall.Rating Passenger.Country Trip_verified
## 1 0 2024-02-03 10 United Kingdom Not Verified
## 2 1 2024-01-26 10 United Kingdom Trip Verified
## 3 2 2024-01-20 10 United Kingdom Trip Verified
## 4 3 2024-01-07 6 United Kingdom Trip Verified
## 5 4 2024-01-06 10 Israel Trip Verified
## 6 5 2024-01-06 1 Denmark Not Verified
## 7 6 2024-01-03 5 United Kingdom Not Verified
## 8 7 2024-01-03 1 Australia Trip Verified
## 9 9 2023-12-08 1 Germany Not Verified
## 10 10 2023-12-06 8 Albania Not Verified
## 11 11 2023-12-04 1 Singapore Trip Verified
## 12 13 2023-12-02 1 United Kingdom Trip Verified
## 13 14 2023-11-21 1 Canada Trip Verified
## 14 15 2023-11-07 9 United Kingdom Not Verified
## 15 16 2023-11-05 1 Portugal Trip Verified
## 16 17 2023-11-02 9 United Kingdom Not Verified
## 17 18 2023-10-28 5 Germany Trip Verified
## 18 19 2023-10-24 1 Spain Not Verified
## 19 21 2023-10-21 10 Norway Not Verified
## 20 22 2023-10-18 2 Israel Trip Verified
## 21 23 2023-10-06 1 United States Trip Verified
## 22 24 2023-10-02 2 United States Trip Verified
## 23 25 2023-09-25 1 Sweden Trip Verified
## 24 26 2023-09-23 7 United Kingdom Trip Verified
## 25 27 2023-09-21 1 United Kingdom Trip Verified
## 26 28 2023-09-21 8 Belgium Trip Verified
## 27 29 2023-09-19 2 Portugal Not Verified
## 28 30 2023-09-17 2 Iraq Trip Verified
## 29 31 2023-09-11 1 Portugal Trip Verified
## 30 32 2023-09-11 7 Portugal Trip Verified
## 31 33 2023-09-11 1 Belgium Not Verified
## 32 34 2023-09-10 1 Spain Trip Verified
## 33 35 2023-09-07 1 United States Not Verified
## 34 36 2023-09-04 4 United Kingdom Trip Verified
## 35 37 2023-08-29 1 United Kingdom Trip Verified
## 36 38 2023-08-24 1 United Arab Emirates Trip Verified
## 37 39 2023-08-22 1 Czech Republic Trip Verified
## 38 40 2023-08-15 1 Canada Not Verified
## 39 41 2023-08-13 1 Greece Not Verified
## 40 42 2023-08-12 6 Morocco Trip Verified
## 41 43 2023-08-11 7 Germany Trip Verified
## 42 44 2023-08-10 7 Ireland Not Verified
## 43 45 2023-08-08 1 United States Not Verified
## 44 46 2023-08-04 1 United Kingdom Trip Verified
## 45 47 2023-08-01 1 Germany Trip Verified
## 46 48 2023-08-01 1 Australia Trip Verified
## 47 49 2023-07-29 4 United Kingdom Trip Verified
## 48 50 2023-07-28 1 United Kingdom Trip Verified
## 49 51 2023-07-26 1 Netherlands Trip Verified
## 50 52 2023-07-23 3 United Kingdom Trip Verified
## 51 53 2023-07-22 1 Gibraltar Trip Verified
## 52 54 2023-07-19 2 Canada Trip Verified
## 53 56 2023-07-17 1 United States Trip Verified
## 54 57 2023-07-13 8 Ireland Not Verified
## 55 58 2023-07-10 1 United States Not Verified
## 56 59 2023-07-08 1 United States Not Verified
## 57 60 2023-07-06 10 Australia Trip Verified
## 58 61 2023-07-05 1 Australia Trip Verified
## 59 62 2023-07-04 1 Netherlands Trip Verified
## 60 63 2023-07-02 4 Germany Trip Verified
## 61 65 2023-06-26 9 Israel Trip Verified
## 62 66 2023-06-25 1 Canada Trip Verified
## 63 67 2023-06-24 7 Germany Trip Verified
## 64 68 2023-06-24 1 United States Trip Verified
## 65 69 2023-06-19 1 United Kingdom Not Verified
## 66 70 2023-06-17 1 United States Trip Verified
## 67 71 2023-06-14 1 United Kingdom Trip Verified
## 68 72 2023-06-13 1 India Not Verified
## 69 73 2023-06-03 1 United States Trip Verified
## 70 74 2023-06-02 7 United Kingdom Trip Verified
## 71 75 2023-06-01 1 United Kingdom Trip Verified
## 72 76 2023-05-28 1 United Kingdom Trip Verified
## 73 77 2023-05-27 5 Germany Trip Verified
## 74 78 2023-05-26 8 Slovenia Trip Verified
## 75 79 2023-05-24 1 United Kingdom Trip Verified
## 76 80 2023-05-21 1 United Kingdom Not Verified
## 77 82 2023-05-15 1 South Africa Not Verified
## 78 83 2023-05-15 4 United Kingdom Trip Verified
## 79 84 2023-05-15 6 United Kingdom Trip Verified
## 80 85 2023-05-14 1 Ireland Trip Verified
## 81 86 2023-05-14 8 Ireland Trip Verified
## 82 87 2023-05-13 1 United Kingdom Trip Verified
## 83 88 2023-05-11 1 Switzerland Trip Verified
## 84 89 2023-05-11 1 New Zealand Not Verified
## 85 91 2023-05-09 1 South Africa Trip Verified
## 86 92 2023-05-08 1 Austria Trip Verified
## 87 93 2023-05-03 7 France Trip Verified
## 88 94 2023-05-03 5 France Trip Verified
## 89 95 2023-05-02 10 United Kingdom Trip Verified
## 90 96 2023-05-02 10 United Kingdom Trip Verified
## 91 97 2023-05-01 9 United States Trip Verified
## 92 98 2023-04-29 1 United Kingdom Trip Verified
## 93 99 2023-04-28 8 Netherlands Trip Verified
## 94 100 2023-04-24 9 Belarus Trip Verified
## 95 101 2023-04-22 1 United Kingdom Trip Verified
## 96 102 2023-04-22 10 Portugal Trip Verified
## 97 103 2023-04-21 1 United Kingdom Trip Verified
## 98 104 2023-04-19 2 United Kingdom Trip Verified
## 99 105 2023-04-13 1 Israel Trip Verified
## 100 106 2023-04-12 6 Ireland Trip Verified
## 101 107 2023-04-11 6 Germany Trip Verified
## 102 108 2023-04-10 1 Norway Trip Verified
## 103 109 2023-04-08 1 Italy Trip Verified
## 104 110 2023-04-05 1 Slovakia Not Verified
## 105 111 2023-03-31 1 Belgium Not Verified
## 106 112 2023-03-28 1 Norway Not Verified
## 107 113 2023-03-25 7 Croatia Trip Verified
## 108 114 2023-03-23 1 United Kingdom Trip Verified
## 109 115 2023-03-18 1 Sweden Trip Verified
## 110 116 2023-03-15 1 United Kingdom Not Verified
## 111 117 2023-03-12 1 United Kingdom Not Verified
## 112 119 2023-03-04 10 Portugal Trip Verified
## 113 120 2023-02-16 2 Germany Not Verified
## 114 121 2023-02-14 2 Ireland Trip Verified
## 115 122 2023-02-08 10 United Kingdom Trip Verified
## 116 123 2023-02-08 9 Hungary Trip Verified
## 117 124 2023-02-08 1 Lithuania Trip Verified
## 118 125 2023-02-07 8 Israel Not Verified
## 119 126 2023-01-30 1 Ireland Trip Verified
## 120 127 2023-01-30 8 Ireland Not Verified
## 121 128 2023-01-29 10 United Kingdom Not Verified
## 122 129 2023-01-19 1 United Kingdom Trip Verified
## 123 130 2023-01-17 10 United Kingdom Trip Verified
## 124 131 2023-01-10 1 United Kingdom Trip Verified
## 125 132 2023-01-08 9 United Kingdom Trip Verified
## 126 133 2023-01-05 1 Germany Trip Verified
## 127 134 2023-01-04 1 United Kingdom Not Verified
## 128 135 2023-01-03 1 Poland Trip Verified
## 129 136 2023-01-03 1 United States Not Verified
## 130 137 2022-12-23 1 Portugal Trip Verified
## 131 138 2022-12-19 3 Ireland Trip Verified
## 132 139 2022-12-18 1 Netherlands Trip Verified
## 133 140 2022-12-13 8 United Kingdom Trip Verified
## 134 141 2022-12-10 3 Finland Not Verified
## 135 142 2022-12-07 1 Latvia Trip Verified
## 136 143 2022-12-06 2 United Kingdom Not Verified
## 137 144 2022-12-04 10 United Kingdom Trip Verified
## 138 145 2022-11-19 8 United Kingdom Trip Verified
## 139 146 2022-11-17 1 United States Trip Verified
## 140 147 2022-11-16 4 Italy Trip Verified
## 141 148 2022-11-10 1 United Kingdom Trip Verified
## 142 149 2022-11-08 1 Portugal Trip Verified
## 143 150 2022-11-07 1 Portugal Trip Verified
## 144 151 2022-11-06 1 United Kingdom Trip Verified
## 145 152 2022-11-05 7 United Kingdom Trip Verified
## 146 153 2022-11-05 2 United Kingdom Trip Verified
## 147 154 2022-11-04 1 Germany Not Verified
## 148 155 2022-11-03 1 Ukraine Not Verified
## 149 156 2022-10-31 3 United Kingdom Trip Verified
## 150 157 2022-10-30 10 United Kingdom Trip Verified
## 151 158 2022-10-25 2 Canada Trip Verified
## 152 159 2022-10-24 1 United Kingdom Trip Verified
## 153 161 2022-10-23 1 United Kingdom Trip Verified
## 154 163 2022-10-17 5 France Trip Verified
## 155 164 2022-10-14 1 Canada Trip Verified
## 156 166 2022-10-09 2 United States Trip Verified
## 157 167 2022-10-05 1 Greece Not Verified
## 158 168 2022-10-03 1 Italy Trip Verified
## 159 169 2022-09-30 1 United Kingdom Trip Verified
## 160 170 2022-09-29 10 United Kingdom Trip Verified
## 161 171 2022-09-28 1 Sweden Trip Verified
## 162 172 2022-09-28 1 Switzerland Trip Verified
## 163 173 2022-09-18 1 Poland Not Verified
## 164 174 2022-09-09 2 Ireland Not Verified
## 165 175 2022-09-03 6 United Kingdom Trip Verified
## 166 176 2022-09-02 3 United Kingdom Trip Verified
## 167 177 2022-09-02 8 United Kingdom Not Verified
## 168 178 2022-08-30 1 United States Trip Verified
## 169 179 2022-08-29 5 Luxembourg Trip Verified
## 170 180 2022-08-27 1 France Trip Verified
## 171 181 2022-08-25 1 United States Trip Verified
## 172 182 2022-08-20 3 United Kingdom Trip Verified
## 173 183 2022-08-20 1 United Kingdom Trip Verified
## 174 184 2022-08-18 1 United States Trip Verified
## 175 185 2022-08-17 1 South Africa Trip Verified
## 176 186 2022-08-17 1 Finland Trip Verified
## 177 187 2022-08-16 1 United Kingdom Trip Verified
## 178 188 2022-08-14 9 United Kingdom Not Verified
## 179 189 2022-08-12 1 United States Trip Verified
## 180 190 2022-08-10 6 Indonesia Trip Verified
## 181 191 2022-08-06 1 Sweden Not Verified
## 182 192 2022-07-30 1 United Kingdom Trip Verified
## 183 193 2022-07-30 6 United Kingdom Trip Verified
## 184 194 2022-07-29 10 United Kingdom Trip Verified
## 185 195 2022-07-27 1 Australia Not Verified
## 186 196 2022-07-24 6 United Kingdom Trip Verified
## 187 197 2022-07-22 8 United Kingdom Not Verified
## 188 198 2022-07-19 3 Ireland Not Verified
## 189 199 2022-07-17 1 Czech Republic Not Verified
## 190 200 2022-07-17 1 United Kingdom Trip Verified
## 191 201 2022-07-15 1 Greece Trip Verified
## 192 202 2022-07-15 1 Sweden Trip Verified
## 193 203 2022-07-14 1 Sweden Trip Verified
## 194 204 2022-07-14 10 Spain Not Verified
## 195 205 2022-07-13 1 Germany Trip Verified
## 196 206 2022-07-12 1 Romania Not Verified
## 197 208 2022-07-10 1 United States Trip Verified
## 198 209 2022-07-07 1 Austria Trip Verified
## 199 210 2022-07-07 1 Netherlands Trip Verified
## 200 211 2022-07-07 1 United States Trip Verified
## 201 212 2022-07-05 8 Portugal Not Verified
## 202 213 2022-07-04 7 Ireland Not Verified
## 203 214 2022-07-02 1 United Kingdom Trip Verified
## 204 215 2022-07-02 1 Romania Not Verified
## 205 216 2022-07-01 1 United Kingdom Trip Verified
## 206 217 2022-07-01 1 Czech Republic Not Verified
## 207 218 2022-06-25 1 United States Trip Verified
## 208 219 2022-06-21 1 Germany Trip Verified
## 209 220 2022-06-21 9 Belgium Trip Verified
## 210 221 2022-06-18 1 United Kingdom Trip Verified
## 211 222 2022-06-18 1 Germany Trip Verified
## 212 223 2022-06-16 1 United States Trip Verified
## 213 224 2022-06-14 3 United Kingdom Trip Verified
## 214 225 2022-06-13 1 United Kingdom Not Verified
## 215 226 2022-06-11 1 Spain Trip Verified
## 216 227 2022-06-11 9 United Kingdom Trip Verified
## 217 228 2022-06-11 1 Germany Trip Verified
## 218 229 2022-06-08 7 United Kingdom Not Verified
## 219 230 2022-06-01 3 United Kingdom Trip Verified
## 220 231 2022-05-31 1 Malta Trip Verified
## 221 232 2022-05-27 2 United Kingdom Not Verified
## 222 233 2022-05-24 2 Norway Trip Verified
## 223 234 2022-05-22 2 United Kingdom Trip Verified
## 224 235 2022-05-16 1 Croatia Not Verified
## 225 236 2022-05-14 8 United Kingdom Not Verified
## 226 237 2022-05-10 3 United Kingdom Not Verified
## 227 238 2022-05-08 7 United Kingdom Not Verified
## 228 239 2022-05-04 1 Ireland Not Verified
## 229 240 2022-04-28 1 United Kingdom Trip Verified
## 230 241 2022-04-26 3 United Kingdom Trip Verified
## 231 242 2022-04-06 1 United Kingdom Not Verified
## 232 243 2022-04-04 1 Ukraine Trip Verified
## 233 244 2022-04-03 1 United States Trip Verified
## 234 245 2022-03-29 1 Spain Trip Verified
## 235 246 2022-03-25 3 Finland Not Verified
## 236 247 2022-03-25 1 United Kingdom Trip Verified
## 237 248 2022-03-21 1 Belgium Not Verified
## 238 249 2022-03-19 1 United Kingdom Trip Verified
## 239 250 2022-03-19 10 Ireland Trip Verified
## 240 251 2022-03-12 1 Ireland Trip Verified
## 241 252 2022-03-10 1 United Kingdom Not Verified
## 242 253 2022-03-07 8 United Kingdom Not Verified
## 243 254 2022-03-07 1 Estonia Trip Verified
## 244 255 2022-02-27 1 United States Trip Verified
## 245 256 2022-02-10 1 United Kingdom Trip Verified
## 246 257 2022-02-10 1 United States Trip Verified
## 247 258 2022-02-09 1 Israel Trip Verified
## 248 259 2022-02-02 10 United Kingdom Trip Verified
## 249 260 2022-02-01 10 Israel Trip Verified
## 250 261 2022-01-31 1 United Kingdom Trip Verified
## 251 262 2022-01-01 1 Singapore Trip Verified
## 252 263 2021-12-27 1 Ireland Not Verified
## 253 264 2021-12-16 1 France Not Verified
## 254 265 2021-12-10 1 Israel Trip Verified
## 255 267 2021-12-01 1 United Kingdom Trip Verified
## 256 268 2021-12-01 1 Ireland Trip Verified
## 257 269 2021-11-26 2 Italy Trip Verified
## 258 270 2021-11-24 10 United Kingdom Not Verified
## 259 271 2021-11-24 1 Israel Not Verified
## 260 272 2021-11-23 1 Estonia Trip Verified
## 261 273 2021-11-22 7 Ukraine Trip Verified
## 262 274 2021-11-19 9 Cyprus Trip Verified
## 263 275 2021-11-18 1 Germany Trip Verified
## 264 276 2021-11-14 1 Germany Trip Verified
## 265 277 2021-11-14 1 Italy Trip Verified
## 266 278 2021-11-13 2 United Kingdom Not Verified
## 267 279 2021-11-12 1 United States Trip Verified
## 268 280 2021-11-12 1 United Kingdom Trip Verified
## 269 281 2021-11-10 3 Canada Trip Verified
## 270 282 2021-11-05 5 Germany Trip Verified
## 271 283 2021-10-26 1 United Kingdom Not Verified
## 272 284 2021-10-24 8 United Kingdom Trip Verified
## 273 285 2021-10-14 1 Belgium Not Verified
## 274 286 2021-10-13 2 United Kingdom Not Verified
## 275 287 2021-10-08 1 United Kingdom Trip Verified
## 276 289 2021-09-30 1 Macedonia Not Verified
## 277 290 2021-09-28 10 United Kingdom Not Verified
## 278 291 2021-09-25 1 Switzerland Trip Verified
## 279 292 2021-09-16 9 Ukraine Trip Verified
## 280 294 2021-09-08 1 United Kingdom Not Verified
## 281 295 2021-09-05 1 United Kingdom Not Verified
## 282 296 2021-09-05 2 United Kingdom Not Verified
## 283 297 2021-09-04 1 Israel Trip Verified
## 284 298 2021-08-20 1 Germany Trip Verified
## 285 299 2021-08-13 3 Italy Trip Verified
## 286 300 2021-07-25 2 Ireland Not Verified
## 287 302 2021-07-21 2 Bulgaria Trip Verified
## 288 303 2021-07-20 2 United Kingdom Trip Verified
## 289 305 2021-07-19 1 United Kingdom Not Verified
## 290 306 2021-07-18 3 Austria Trip Verified
## 291 307 2021-07-16 1 United States Not Verified
## 292 308 2021-07-13 6 Canada Trip Verified
## 293 309 2021-07-12 3 Italy Trip Verified
## 294 310 2021-07-11 3 Denmark Trip Verified
## 295 311 2021-07-06 1 Belgium Trip Verified
## 296 312 2021-07-03 1 Czech Republic Trip Verified
## 297 313 2021-06-23 8 Netherlands Trip Verified
## 298 314 2021-06-23 7 Netherlands Trip Verified
## 299 315 2021-06-15 1 Belgium Trip Verified
## 300 316 2021-06-13 1 United States Trip Verified
## 301 317 2021-05-26 9 France Trip Verified
## 302 319 2021-04-26 1 United Kingdom Not Verified
## 303 320 2021-04-13 10 Italy Trip Verified
## 304 321 2021-03-02 1 United Kingdom Trip Verified
## 305 322 2021-02-21 1 Romania Trip Verified
## 306 323 2021-02-21 1 United Kingdom Not Verified
## 307 324 2021-02-18 1 United Kingdom Not Verified
## 308 325 2021-01-14 1 Canada Trip Verified
## 309 326 2021-01-08 1 Spain Trip Verified
## 310 327 2020-12-27 1 United Kingdom Trip Verified
## 311 328 2020-12-22 10 Netherlands Trip Verified
## 312 329 2020-12-15 1 United Kingdom Not Verified
## 313 330 2020-12-06 1 Luxembourg Not Verified
## 314 331 2020-10-30 10 United Kingdom Trip Verified
## 315 332 2020-10-13 9 Spain Not Verified
## 316 333 2020-10-04 1 United Kingdom Trip Verified
## 317 334 2020-10-03 2 United Kingdom Trip Verified
## 318 335 2020-09-22 2 Poland Trip Verified
## 319 336 2020-09-03 1 United Kingdom Trip Verified
## 320 337 2020-09-03 1 Cyprus Trip Verified
## 321 338 2020-08-30 10 United Kingdom Not Verified
## 322 339 2020-08-29 1 Ireland Not Verified
## 323 340 2020-08-29 1 United Kingdom Trip Verified
## 324 341 2020-08-28 1 Ireland Trip Verified
## 325 342 2020-08-27 1 United Kingdom Trip Verified
## 326 343 2020-08-23 2 United Kingdom Not Verified
## 327 344 2020-08-21 4 United Kingdom Not Verified
## 328 345 2020-08-19 1 Portugal Not Verified
## 329 346 2020-08-15 9 Portugal Trip Verified
## 330 347 2020-08-10 1 Finland Trip Verified
## 331 348 2020-08-10 1 United Kingdom Trip Verified
## 332 349 2020-08-09 1 Germany Trip Verified
## 333 350 2020-08-03 1 United Kingdom Trip Verified
## 334 351 2020-08-01 1 United Kingdom Trip Verified
## 335 352 2020-07-28 1 Ireland Not Verified
## 336 353 2020-07-20 8 United Kingdom Trip Verified
## 337 354 2020-07-14 10 Ireland Trip Verified
## 338 355 2020-07-08 2 United Kingdom Not Verified
## 339 356 2020-07-04 10 Portugal Trip Verified
## 340 357 2020-06-17 1 Australia Trip Verified
## 341 358 2020-06-04 1 United Kingdom Trip Verified
## 342 359 2020-05-15 1 United Kingdom Trip Verified
## 343 360 2020-05-13 1 United Kingdom Not Verified
## 344 361 2020-04-30 1 Belgium Not Verified
## 345 362 2020-04-29 1 United Kingdom Not Verified
## 346 363 2020-04-28 1 Netherlands Trip Verified
## 347 364 2020-04-26 1 Denmark Not Verified
## 348 365 2020-04-25 1 Romania Not Verified
## 349 366 2020-04-24 1 United Kingdom Not Verified
## 350 367 2020-04-23 7 Italy Trip Verified
## 351 368 2020-04-22 1 United Kingdom Trip Verified
## 352 369 2020-04-19 1 United Kingdom Trip Verified
## 353 370 2020-03-30 8 Australia Not Verified
## 354 371 2020-03-23 9 United Kingdom Trip Verified
## 355 372 2020-03-23 3 Latvia Trip Verified
## 356 373 2020-03-21 1 Ireland Not Verified
## 357 374 2020-03-20 1 Sweden Not Verified
## 358 375 2020-03-18 1 Lithuania Not Verified
## 359 376 2020-03-18 2 United Kingdom Not Verified
## 360 377 2020-03-13 8 United Kingdom Not Verified
## 361 378 2020-03-11 1 Italy Trip Verified
## 362 379 2020-03-10 1 Portugal Trip Verified
## 363 380 2020-03-07 1 United Kingdom Trip Verified
## 364 381 2020-03-07 1 United Kingdom Trip Verified
## 365 382 2020-03-01 1 Ireland Not Verified
## 366 383 2020-02-28 9 Sweden Not Verified
## 367 384 2020-02-28 1 Morocco Not Verified
## 368 385 2020-02-27 1 United Kingdom Trip Verified
## 369 386 2020-02-26 1 Netherlands Trip Verified
## 370 387 2020-02-24 10 Ireland Trip Verified
## 371 388 2020-02-23 2 Germany Not Verified
## 372 389 2020-02-22 9 Austria Trip Verified
## 373 390 2020-02-22 9 Ireland Trip Verified
## 374 392 2020-02-20 1 United Kingdom Trip Verified
## 375 393 2020-02-20 1 Canada Trip Verified
## 376 394 2020-02-19 1 Portugal Trip Verified
## 377 395 2020-02-18 1 United Kingdom Not Verified
## 378 396 2020-02-17 2 Germany Trip Verified
## 379 397 2020-02-17 10 United Kingdom Trip Verified
## 380 398 2020-02-14 10 United Kingdom Not Verified
## 381 399 2020-02-11 5 Poland Not Verified
## 382 400 2020-02-10 8 Sweden Trip Verified
## 383 401 2020-02-09 1 Netherlands Not Verified
## 384 402 2020-02-09 8 Norway Trip Verified
## 385 403 2020-02-08 1 Spain Not Verified
## 386 404 2020-02-07 1 Australia Trip Verified
## 387 405 2020-02-07 2 United Kingdom Trip Verified
## 388 406 2020-02-05 8 United Kingdom Trip Verified
## 389 407 2020-02-05 1 Italy Trip Verified
## 390 408 2020-02-02 9 Ireland Trip Verified
## 391 409 2020-01-30 1 Bulgaria Trip Verified
## 392 410 2020-01-29 1 United States Trip Verified
## 393 411 2020-01-28 1 United Kingdom Trip Verified
## 394 412 2020-01-26 1 United Kingdom Trip Verified
## 395 413 2020-01-26 1 United Kingdom Trip Verified
## 396 414 2020-01-21 10 United Kingdom Not Verified
## 397 415 2020-01-18 10 United Kingdom Not Verified
## 398 416 2020-01-17 1 United States Trip Verified
## 399 417 2020-01-15 1 Ireland Trip Verified
## 400 418 2020-01-15 1 Ireland Trip Verified
## 401 419 2020-01-14 1 United States Trip Verified
## 402 420 2020-01-14 2 Ireland Trip Verified
## 403 421 2020-01-12 9 Czech Republic Trip Verified
## 404 422 2020-01-11 1 France Trip Verified
## 405 423 2020-01-08 1 Portugal Trip Verified
## 406 424 2020-01-08 1 Ireland Trip Verified
## 407 425 2020-01-08 3 Romania Not Verified
## 408 426 2020-01-07 1 United Kingdom Trip Verified
## 409 428 2020-01-07 1 United Kingdom Trip Verified
## 410 429 2020-01-05 1 Netherlands Not Verified
## 411 430 2020-01-04 1 Netherlands Trip Verified
## 412 431 2020-01-04 2 United Kingdom Trip Verified
## 413 432 2020-01-03 1 United Kingdom Trip Verified
## 414 433 2020-01-03 2 United States Trip Verified
## 415 434 2020-01-03 9 India Trip Verified
## 416 435 2020-01-02 1 Germany Trip Verified
## 417 436 2020-01-01 1 United Kingdom Trip Verified
## 418 437 2019-12-31 1 United Kingdom Trip Verified
## 419 438 2019-12-31 2 Switzerland Trip Verified
## 420 439 2019-12-28 1 United Kingdom Trip Verified
## 421 440 2019-12-25 1 United States Trip Verified
## 422 441 2019-12-24 1 United Kingdom Trip Verified
## 423 442 2019-12-23 1 Spain Trip Verified
## 424 443 2019-12-20 1 United Kingdom Trip Verified
## 425 444 2019-12-18 1 Australia Trip Verified
## 426 445 2019-12-11 6 United Kingdom Not Verified
## 427 446 2019-12-08 8 Ukraine Not Verified
## 428 447 2019-12-08 8 United Kingdom Trip Verified
## 429 448 2019-12-08 1 Denmark Not Verified
## 430 449 2019-12-03 2 United Kingdom Trip Verified
## 431 450 2019-12-02 1 Morocco Not Verified
## 432 451 2019-11-29 1 Italy Trip Verified
## 433 452 2019-11-27 1 Germany Not Verified
## 434 453 2019-11-27 3 United States Not Verified
## 435 454 2019-11-26 1 United Kingdom Not Verified
## 436 455 2019-11-25 5 Canada Trip Verified
## 437 456 2019-11-24 9 Ireland Not Verified
## 438 457 2019-11-23 1 United States Trip Verified
## 439 458 2019-11-22 1 United Kingdom Not Verified
## 440 459 2019-11-22 1 Netherlands Not Verified
## 441 460 2019-11-22 1 United Kingdom Trip Verified
## 442 461 2019-11-22 1 Singapore Trip Verified
## 443 462 2019-11-21 1 United Kingdom Trip Verified
## 444 463 2019-11-18 1 United Kingdom Trip Verified
## 445 464 2019-11-16 1 France Not Verified
## 446 465 2019-11-16 1 United Kingdom Trip Verified
## 447 466 2019-11-15 2 United Kingdom Not Verified
## 448 467 2019-11-14 1 United States Not Verified
## 449 468 2019-11-14 1 Mexico Trip Verified
## 450 469 2019-11-14 1 Spain Trip Verified
## 451 470 2019-11-13 3 United Kingdom Trip Verified
## 452 472 2019-11-11 1 United Kingdom Not Verified
## 453 473 2019-11-10 10 Ireland Trip Verified
## 454 474 2019-11-10 2 Ireland Trip Verified
## 455 475 2019-11-10 1 France Trip Verified
## 456 476 2019-11-10 1 Australia Not Verified
## 457 477 2019-11-09 1 Switzerland Trip Verified
## 458 478 2019-11-08 7 United Kingdom Trip Verified
## 459 479 2019-11-08 1 United Kingdom Trip Verified
## 460 480 2019-11-08 1 Austria Trip Verified
## 461 481 2019-11-06 1 Cyprus Trip Verified
## 462 482 2019-11-05 1 United States Trip Verified
## 463 483 2019-11-02 1 United Kingdom Trip Verified
## 464 484 2019-11-02 1 Germany Trip Verified
## 465 485 2019-11-02 4 United Kingdom Trip Verified
## 466 486 2019-11-02 5 Ireland Trip Verified
## 467 487 2019-10-30 6 United Kingdom Trip Verified
## 468 488 2019-10-29 1 United Kingdom Trip Verified
## 469 489 2019-10-27 1 United Kingdom Trip Verified
## 470 490 2019-10-26 4 Netherlands Trip Verified
## 471 491 2019-10-26 1 Ireland Trip Verified
## 472 492 2019-10-25 8 Spain Not Verified
## 473 493 2019-10-25 2 United Kingdom Unknown
## 474 494 2019-10-24 2 United States Trip Verified
## 475 495 2019-10-23 1 Canada Not Verified
## 476 496 2019-10-22 1 Canada Not Verified
## 477 497 2019-10-21 10 Ukraine Trip Verified
## 478 498 2019-10-19 1 Australia Trip Verified
## 479 499 2019-10-17 1 United States Trip Verified
## 480 500 2019-10-17 2 United Kingdom Not Verified
## 481 501 2019-10-17 1 United Kingdom Not Verified
## 482 502 2019-10-17 1 United States Trip Verified
## 483 503 2019-10-17 1 Australia Not Verified
## 484 504 2019-10-17 1 United Kingdom Not Verified
## 485 505 2019-10-15 1 United Kingdom Not Verified
## 486 506 2019-10-14 2 Albania Trip Verified
## 487 507 2019-10-14 1 Canada Trip Verified
## 488 508 2019-10-14 1 Czech Republic Trip Verified
## 489 509 2019-10-13 3 Mexico Trip Verified
## 490 510 2019-10-13 1 United Kingdom Trip Verified
## 491 511 2019-10-11 1 United Kingdom Not Verified
## 492 512 2019-10-11 2 United Kingdom Trip Verified
## 493 513 2019-10-11 1 United Kingdom Trip Verified
## 494 514 2019-10-11 1 Canada Trip Verified
## 495 515 2019-10-10 2 United Kingdom Trip Verified
## 496 516 2019-10-10 1 Ukraine Trip Verified
## 497 517 2019-10-08 1 Germany Trip Verified
## 498 518 2019-10-07 1 Israel Trip Verified
## 499 519 2019-10-06 3 United Kingdom Trip Verified
## 500 520 2019-10-03 1 United States Trip Verified
## 501 521 2019-10-03 5 Australia Trip Verified
## 502 522 2019-10-02 1 United Kingdom Trip Verified
## 503 523 2019-10-02 2 United Kingdom Trip Verified
## 504 524 2019-10-01 1 Australia Trip Verified
## 505 525 2019-09-30 1 Vietnam Trip Verified
## 506 526 2019-09-30 1 Austria Trip Verified
## 507 527 2019-09-30 3 Australia Trip Verified
## 508 528 2019-09-30 10 United Kingdom Not Verified
## 509 529 2019-09-29 1 Germany Trip Verified
## 510 530 2019-09-29 1 Netherlands Trip Verified
## 511 531 2019-09-28 2 Italy Not Verified
## 512 532 2019-09-28 1 United Kingdom Not Verified
## 513 533 2019-09-27 1 Romania Trip Verified
## 514 534 2019-09-26 7 United Kingdom Trip Verified
## 515 535 2019-09-26 9 United Kingdom Trip Verified
## 516 536 2019-09-26 1 United States Trip Verified
## 517 537 2019-09-25 10 United Kingdom Not Verified
## 518 538 2019-09-25 1 Germany Trip Verified
## 519 539 2019-09-24 1 Romania Trip Verified
## 520 540 2019-09-23 2 Canada Not Verified
## 521 541 2019-09-23 1 Germany Trip Verified
## 522 542 2019-09-22 10 Australia Trip Verified
## 523 543 2019-09-22 1 United States Trip Verified
## 524 544 2019-09-19 1 United Kingdom Not Verified
## 525 545 2019-09-18 1 United States Trip Verified
## 526 546 2019-09-18 10 United Kingdom Trip Verified
## 527 547 2019-09-18 1 United Kingdom Not Verified
## 528 548 2019-09-15 3 United Kingdom Trip Verified
## 529 549 2019-09-15 1 Lebanon Trip Verified
## 530 550 2019-09-14 2 Ireland Trip Verified
## 531 551 2019-09-14 1 Germany Trip Verified
## 532 552 2019-09-13 1 Ireland Trip Verified
## 533 553 2019-09-13 1 United Kingdom Not Verified
## 534 554 2019-09-12 1 United States Trip Verified
## 535 555 2019-09-12 6 Italy Not Verified
## 536 556 2019-09-11 1 Australia Not Verified
## 537 557 2019-09-11 1 Canada Trip Verified
## 538 558 2019-09-11 2 Spain Trip Verified
## 539 559 2019-09-10 1 United States Trip Verified
## 540 560 2019-09-09 1 United Kingdom Trip Verified
## 541 561 2019-09-09 1 United Kingdom Trip Verified
## 542 562 2019-09-08 1 Romania Trip Verified
## 543 563 2019-09-08 2 Latvia Trip Verified
## 544 564 2019-09-03 1 United Arab Emirates Trip Verified
## 545 565 2019-09-03 1 United States Trip Verified
## 546 566 2019-09-03 1 United Kingdom Not Verified
## 547 567 2019-09-02 1 United Kingdom Not Verified
## 548 568 2019-09-02 5 United Kingdom Not Verified
## 549 569 2019-09-02 1 United Kingdom Trip Verified
## 550 570 2019-09-02 1 United Kingdom Trip Verified
## 551 571 2019-09-02 2 United Kingdom Not Verified
## 552 572 2019-09-01 1 United States Not Verified
## 553 573 2019-09-01 3 Serbia Trip Verified
## 554 574 2019-08-31 2 United Kingdom Not Verified
## 555 575 2019-08-31 8 United States Not Verified
## 556 576 2019-08-30 1 India Trip Verified
## 557 577 2019-08-30 10 United Kingdom Trip Verified
## 558 578 2019-08-29 1 Canada Trip Verified
## 559 579 2019-08-29 1 United Kingdom Trip Verified
## 560 580 2019-08-28 1 United Kingdom Trip Verified
## 561 581 2019-08-28 1 United Kingdom Trip Verified
## 562 582 2019-08-27 4 United Kingdom Not Verified
## 563 583 2019-08-26 1 United Kingdom Trip Verified
## 564 584 2019-08-26 8 United Kingdom Trip Verified
## 565 585 2019-08-26 5 United Kingdom Not Verified
## 566 586 2019-08-26 1 United Kingdom Trip Verified
## 567 587 2019-08-24 1 United Kingdom Trip Verified
## 568 588 2019-08-24 3 United Kingdom Not Verified
## 569 589 2019-08-24 3 United Kingdom Trip Verified
## 570 590 2019-08-24 1 United Kingdom Trip Verified
## 571 591 2019-08-23 2 United Kingdom Trip Verified
## 572 592 2019-08-23 1 United Kingdom Trip Verified
## 573 593 2019-08-23 1 United Kingdom Not Verified
## 574 594 2019-08-22 1 United Kingdom Trip Verified
## 575 595 2019-08-21 2 Australia Trip Verified
## 576 596 2019-08-20 1 Canada Trip Verified
## 577 597 2019-08-20 1 United Kingdom Not Verified
## 578 598 2019-08-19 2 United Kingdom Not Verified
## 579 599 2019-08-16 1 Canada Trip Verified
## 580 600 2019-08-16 7 Ireland Trip Verified
## 581 601 2019-08-16 1 United Kingdom Trip Verified
## 582 602 2019-08-15 4 South Africa Trip Verified
## 583 603 2019-08-14 10 Ireland NotVerified
## 584 604 2019-08-13 7 Hungary NotVerified
## 585 605 2019-08-12 1 United Kingdom Trip Verified
## 586 606 2019-08-12 9 Portugal Trip Verified
## 587 607 2019-08-12 1 United States Trip Verified
## 588 608 2019-08-05 2 Austria Not Verified
## 589 609 2019-08-05 1 United Kingdom Trip Verified
## 590 610 2019-08-03 7 United Kingdom Trip Verified
## 591 611 2019-08-03 6 United Kingdom Trip Verified
## 592 612 2019-08-03 7 United Kingdom Trip Verified
## 593 613 2019-07-31 2 Czech Republic Trip Verified
## 594 614 2019-07-30 1 France Not Verified
## 595 615 2019-07-30 9 France Trip Verified
## 596 616 2019-07-30 1 United States Trip Verified
## 597 617 2019-07-30 1 India Trip Verified
## 598 618 2019-07-29 1 United Kingdom Trip Verified
## 599 619 2019-07-26 1 United Kingdom Trip Verified
## 600 620 2019-07-26 3 United States Trip Verified
## 601 621 2019-07-24 1 United Kingdom Trip Verified
## 602 622 2019-07-24 3 United Kingdom Trip Verified
## 603 623 2019-07-22 1 United Kingdom Trip Verified
## 604 624 2019-07-19 1 United States Trip Verified
## 605 625 2019-07-18 1 Turkey Trip Verified
## 606 626 2019-07-18 1 United Kingdom Trip Verified
## 607 627 2019-07-18 1 Canada Trip Verified
## 608 628 2019-07-16 10 United Kingdom Trip Verified
## 609 629 2019-07-16 10 United Kingdom Trip Verified
## 610 630 2019-07-16 2 Ireland Trip Verified
## 611 631 2019-07-16 1 United Kingdom Not Verified
## 612 632 2019-07-15 1 United Kingdom Trip Verified
## 613 633 2019-07-14 1 United States Not Verified
## 614 634 2019-07-14 1 United Kingdom Not Verified
## 615 635 2019-07-11 1 New Zealand Not Verified
## 616 636 2019-07-11 1 United Kingdom Trip Verified
## 617 637 2019-07-09 1 United Kingdom Trip Verified
## 618 638 2019-07-08 1 Malaysia Trip Verified
## 619 639 2019-07-08 1 Italy Trip Verified
## 620 640 2019-07-07 1 Canada Trip Verified
## 621 641 2019-07-05 1 United States Trip Verified
## 622 642 2019-07-01 8 Spain Trip Verified
## 623 643 2019-06-30 1 Canada Trip Verified
## 624 644 2019-06-28 7 India Trip Verified
## 625 645 2019-06-28 1 Canada Not Verified
## 626 646 2019-06-27 2 Ireland Trip Verified
## 627 647 2019-06-26 1 United Kingdom Trip Verified
## 628 648 2019-06-25 1 United Kingdom Trip Verified
## 629 649 2019-06-21 6 United Kingdom Trip Verified
## 630 650 2019-06-21 9 Czech Republic Not Verified
## 631 651 2019-06-20 8 United Arab Emirates Trip Verified
## 632 652 2019-06-20 7 Greece Trip Verified
## 633 653 2019-06-16 10 France Not Verified
## 634 654 2019-06-11 2 Sweden Trip Verified
## 635 655 2019-06-11 1 Canada Not Verified
## 636 656 2019-06-10 1 United Kingdom Trip Verified
## 637 657 2019-06-10 5 Ireland Trip Verified
## 638 658 2019-06-09 1 United Kingdom Not Verified
## 639 659 2019-06-09 1 Ireland Trip Verified
## 640 661 2019-06-05 1 United Kingdom Trip Verified
## 641 662 2019-06-04 7 United States Trip Verified
## 642 663 2019-06-04 1 United Kingdom Trip Verified
## 643 664 2019-06-03 1 United States Trip Verified
## 644 665 2019-06-03 1 Canada Trip Verified
## 645 666 2019-05-30 2 Israel Trip Verified
## 646 667 2019-05-29 3 United Kingdom Trip Verified
## 647 668 2019-05-27 2 Ireland Trip Verified
## 648 669 2019-05-26 1 United Kingdom Trip Verified
## 649 670 2019-05-26 1 Netherlands Trip Verified
## 650 671 2019-05-25 1 Romania Trip Verified
## 651 672 2019-05-23 1 Germany Trip Verified
## 652 673 2019-05-22 7 United States Trip Verified
## 653 674 2019-05-22 1 United Kingdom Trip Verified
## 654 675 2019-05-21 8 Belgium Trip Verified
## 655 676 2019-05-21 9 United States Trip Verified
## 656 677 2019-05-19 1 Morocco Trip Verified
## 657 678 2019-05-18 1 United Kingdom Trip Verified
## 658 679 2019-05-18 10 United Kingdom Trip Verified
## 659 680 2019-05-18 1 United Kingdom Trip Verified
## 660 681 2019-05-14 8 United States Trip Verified
## 661 682 2019-05-13 1 Italy Not Verified
## 662 683 2019-05-12 1 Germany Trip Verified
## 663 684 2019-05-12 1 United Kingdom Trip Verified
## 664 685 2019-05-12 1 United Kingdom Trip Verified
## 665 686 2019-05-11 1 United Kingdom Trip Verified
## 666 687 2019-05-11 1 United Kingdom Trip Verified
## 667 688 2019-05-10 1 United Kingdom Trip Verified
## 668 689 2019-05-10 1 United Kingdom Trip Verified
## 669 690 2019-05-10 6 Hungary Trip Verified
## 670 691 2019-05-09 2 United Kingdom Not Verified
## 671 692 2019-05-09 2 United Kingdom Trip Verified
## 672 693 2019-05-08 1 Canada Trip Verified
## 673 694 2019-05-07 2 Spain Trip Verified
## 674 695 2019-05-07 1 United States Trip Verified
## 675 696 2019-05-06 10 Australia Trip Verified
## 676 697 2019-05-06 4 Ireland Trip Verified
## 677 698 2019-05-02 1 United Kingdom Trip Verified
## 678 699 2019-04-30 1 Germany Trip Verified
## 679 700 2019-04-30 1 United States Trip Verified
## 680 701 2019-04-27 1 Mexico Trip Verified
## 681 702 2019-04-27 1 United Kingdom Trip Verified
## 682 703 2019-04-27 2 United Kingdom Trip Verified
## 683 704 2019-04-26 2 Hungary Trip Verified
## 684 705 2019-04-25 2 United States Trip Verified
## 685 706 2019-04-25 1 Ireland Trip Verified
## 686 707 2019-04-23 1 United States Not Verified
## 687 708 2019-04-23 1 United Kingdom Trip Verified
## 688 709 2019-04-23 1 Canada Trip Verified
## 689 710 2019-04-23 1 United Kingdom Trip Verified
## 690 711 2019-04-23 2 United Kingdom Trip Verified
## 691 712 2019-04-22 5 United Kingdom Trip Verified
## 692 713 2019-04-21 4 Belgium Trip Verified
## 693 714 2019-04-21 3 South Africa Trip Verified
## 694 715 2019-04-20 1 United Kingdom Trip Verified
## 695 716 2019-04-20 1 Germany Trip Verified
## 696 717 2019-04-19 1 United Kingdom Trip Verified
## 697 718 2019-04-18 1 Canada Trip Verified
## 698 719 2019-04-17 1 United Kingdom Not Verified
## 699 720 2019-04-16 10 United Kingdom Trip Verified
## 700 721 2019-04-15 1 United Kingdom Trip Verified
## 701 722 2019-04-15 9 United Kingdom Trip Verified
## 702 723 2019-04-14 1 United Kingdom Trip Verified
## 703 724 2019-04-14 1 Ireland Trip Verified
## 704 725 2019-04-13 1 United States Trip Verified
## 705 726 2019-04-12 3 United Kingdom Trip Verified
## 706 727 2019-04-11 1 United Kingdom Trip Verified
## 707 728 2019-04-11 1 Sweden Trip Verified
## 708 730 2019-04-06 10 United Kingdom Trip Verified
## 709 731 2019-04-06 2 Netherlands Trip Verified
## 710 732 2019-04-05 1 United States Trip Verified
## 711 733 2019-04-05 10 United Kingdom Trip Verified
## 712 734 2019-04-04 7 Portugal Trip Verified
## 713 735 2019-04-04 1 Germany Trip Verified
## 714 736 2019-04-01 1 United Kingdom Trip Verified
## 715 737 2019-03-30 1 Germany Trip Verified
## 716 738 2019-03-29 1 Romania Trip Verified
## 717 739 2019-03-28 1 United Kingdom Not Verified
## 718 740 2019-03-27 10 United Kingdom Trip Verified
## 719 741 2019-03-24 8 United Kingdom Not Verified
## 720 742 2019-03-24 1 India Trip Verified
## 721 743 2019-03-23 10 Ireland Trip Verified
## 722 744 2019-03-22 1 United States Trip Verified
## 723 745 2019-03-22 10 United Kingdom Trip Verified
## 724 746 2019-03-22 1 United Kingdom Trip Verified
## 725 747 2019-03-18 3 United Kingdom Trip Verified
## 726 748 2019-03-17 1 Spain Trip Verified
## 727 749 2019-03-12 1 United Kingdom Trip Verified
## 728 750 2019-03-10 7 Ireland Trip Verified
## 729 751 2019-03-05 10 United Kingdom Trip Verified
## 730 752 2019-03-03 3 United Kingdom Not Verified
## 731 753 2019-02-25 10 United Kingdom Trip Verified
## 732 754 2019-02-23 9 Jordan Trip Verified
## 733 755 2019-02-22 9 Netherlands Trip Verified
## 734 756 2019-02-20 1 United Kingdom Not Verified
## 735 758 2019-02-18 5 Finland Trip Verified
## 736 760 2019-02-16 2 Israel Trip Verified
## 737 761 2019-02-16 8 Spain Trip Verified
## 738 762 2019-02-12 8 Spain Trip Verified
## 739 763 2019-02-07 1 United States Trip Verified
## 740 764 2019-02-05 1 United States Trip Verified
## 741 765 2019-02-05 1 India Trip Verified
## 742 766 2019-02-04 1 Czech Republic Not Verified
## 743 767 2019-02-03 4 Greece Trip Verified
## 744 768 2019-02-03 1 United Kingdom Trip Verified
## 745 769 2019-02-02 1 United States Trip Verified
## 746 770 2019-02-01 1 United Kingdom Trip Verified
## 747 772 2019-02-01 9 United States Trip Verified
## 748 773 2019-01-25 1 Spain Trip Verified
## 749 774 2019-01-22 8 Spain Trip Verified
## 750 775 2019-01-22 8 Spain Trip Verified
## 751 776 2019-01-19 1 Finland Trip Verified
## 752 777 2019-01-18 1 Canada Not Verified
## 753 778 2019-01-16 1 United Kingdom Trip Verified
## 754 779 2019-01-15 8 United Kingdom Trip Verified
## 755 780 2019-01-13 2 United States Trip Verified
## 756 781 2019-01-12 1 United States Trip Verified
## 757 783 2019-01-08 1 Netherlands Trip Verified
## 758 784 2019-01-06 1 United Kingdom Trip Verified
## 759 786 2019-01-05 1 United States Trip Verified
## 760 787 2018-12-31 1 Germany Trip Verified
## 761 788 2018-12-30 1 United Kingdom Trip Verified
## 762 789 2018-12-29 1 United Kingdom Not Verified
## 763 790 2018-12-28 1 United Kingdom Trip Verified
## 764 791 2018-12-28 1 Poland Trip Verified
## 765 792 2018-12-26 1 Netherlands Trip Verified
## 766 793 2018-12-24 1 Denmark Not Verified
## 767 794 2018-12-24 6 United Kingdom Trip Verified
## 768 795 2018-12-23 1 Greece Trip Verified
## 769 796 2018-12-22 1 United Kingdom Not Verified
## 770 797 2018-12-22 2 Spain Trip Verified
## 771 798 2018-12-21 1 Sweden Trip Verified
## 772 799 2018-12-20 1 United States Trip Verified
## 773 800 2018-12-17 3 United Kingdom Not Verified
## 774 801 2018-12-16 1 Poland Trip Verified
## 775 802 2018-12-14 1 Philippines Trip Verified
## 776 803 2018-12-11 1 Germany Trip Verified
## 777 804 2018-12-08 1 United Kingdom Not Verified
## 778 805 2018-12-06 9 Malta Trip Verified
## 779 806 2018-12-06 2 Germany Trip Verified
## 780 807 2018-12-05 2 United Kingdom Trip Verified
## 781 808 2018-12-03 9 United States Trip Verified
## 782 810 2018-12-01 1 United States Not Verified
## 783 811 2018-11-30 2 United Kingdom Trip Verified
## 784 812 2018-11-28 7 France Trip Verified
## 785 813 2018-11-27 1 Ukraine Trip Verified
## 786 814 2018-11-23 1 United Kingdom Not Verified
## 787 815 2018-11-15 1 Canada Trip Verified
## 788 816 2018-11-15 1 Canada Not Verified
## 789 817 2018-11-15 1 Switzerland Trip Verified
## 790 819 2018-11-10 8 Ireland Trip Verified
## 791 820 2018-11-08 3 United Kingdom Trip Verified
## 792 821 2018-11-08 1 United Kingdom Not Verified
## 793 822 2018-11-02 1 Romania Trip Verified
## 794 823 2018-11-02 8 Portugal Trip Verified
## 795 824 2018-10-31 1 Germany Trip Verified
## 796 825 2018-10-30 9 Netherlands Trip Verified
## 797 826 2018-10-30 6 Ireland Trip Verified
## 798 827 2018-10-29 7 Czech Republic Not Verified
## 799 828 2018-10-28 1 United States Not Verified
## 800 829 2018-10-24 9 United States Not Verified
## 801 830 2018-10-24 7 Ireland Trip Verified
## 802 831 2018-10-23 1 Netherlands Trip Verified
## 803 833 2018-10-18 1 Portugal Trip Verified
## 804 834 2018-10-18 1 Canada Trip Verified
## 805 835 2018-10-18 1 Germany Trip Verified
## 806 836 2018-10-17 1 Germany Trip Verified
## 807 837 2018-10-14 3 United Kingdom Trip Verified
## 808 838 2018-10-14 2 United Kingdom Not Verified
## 809 839 2018-10-13 1 Netherlands Trip Verified
## 810 840 2018-10-12 1 United States Trip Verified
## 811 841 2018-10-11 1 New Zealand Trip Verified
## 812 842 2018-10-09 8 Ireland Trip Verified
## 813 843 2018-10-09 9 Greece Trip Verified
## 814 844 2018-10-08 8 Ireland Not Verified
## 815 845 2018-10-07 1 United Kingdom Trip Verified
## 816 846 2018-10-04 5 Japan Trip Verified
## 817 847 2018-10-04 3 Ireland Trip Verified
## 818 848 2018-09-28 2 United States Trip Verified
## 819 849 2018-09-26 10 Portugal Trip Verified
## 820 850 2018-09-25 1 United States Trip Verified
## 821 851 2018-09-22 2 Bulgaria Not Verified
## 822 852 2018-09-21 2 Japan Not Verified
## 823 853 2018-09-20 4 United Kingdom Trip Verified
## 824 854 2018-09-20 1 Cyprus Trip Verified
## 825 855 2018-09-18 2 Canada Trip Verified
## 826 856 2018-09-17 1 Netherlands Trip Verified
## 827 857 2018-09-16 1 Portugal Trip Verified
## 828 858 2018-09-13 3 United Kingdom Not Verified
## 829 859 2018-09-13 1 Greece Trip Verified
## 830 860 2018-09-12 9 Ireland Trip Verified
## 831 861 2018-09-11 4 United Kingdom Trip Verified
## 832 862 2018-09-10 1 Germany Not Verified
## 833 863 2018-09-10 1 United States Not Verified
## 834 864 2018-09-08 1 United Kingdom Trip Verified
## 835 865 2018-09-07 1 United Kingdom Trip Verified
## 836 866 2018-09-05 1 Cyprus Trip Verified
## 837 867 2018-09-02 1 Spain Trip Verified
## 838 869 2018-08-28 8 Slovakia Trip Verified
## 839 870 2018-08-27 3 United Kingdom Trip Verified
## 840 871 2018-08-25 1 United Kingdom Not Verified
## 841 872 2018-08-23 1 United Kingdom Trip Verified
## 842 873 2018-08-21 10 Germany Trip Verified
## 843 874 2018-08-21 9 Slovakia Trip Verified
## 844 875 2018-08-21 5 Germany Trip Verified
## 845 876 2018-08-20 6 Greece Trip Verified
## 846 877 2018-08-20 1 Egypt Trip Verified
## 847 878 2018-08-19 1 United Kingdom Trip Verified
## 848 879 2018-08-18 1 United Kingdom Trip Verified
## 849 880 2018-08-16 1 United States Trip Verified
## 850 881 2018-08-15 6 Germany Trip Verified
## 851 882 2018-08-11 1 United Kingdom Trip Verified
## 852 883 2018-08-09 9 Germany Trip Verified
## 853 884 2018-08-08 1 United Kingdom Trip Verified
## 854 885 2018-08-08 7 Slovakia Trip Verified
## 855 886 2018-08-08 1 United Kingdom Trip Verified
## 856 887 2018-08-07 2 Philippines Trip Verified
## 857 888 2018-08-06 1 United Kingdom Trip Verified
## 858 889 2018-08-03 1 Czech Republic Trip Verified
## 859 890 2018-08-02 1 Italy Trip Verified
## 860 891 2018-08-02 1 Austria Trip Verified
## 861 892 2018-08-02 3 Denmark Trip Verified
## 862 894 2018-08-01 1 United Kingdom Trip Verified
## 863 895 2018-08-01 1 Germany Trip Verified
## 864 896 2018-07-31 1 United Kingdom Trip Verified
## 865 897 2018-07-31 1 United Kingdom Trip Verified
## 866 898 2018-07-31 1 United Kingdom Not Verified
## 867 899 2018-07-30 7 Ireland Trip Verified
## 868 900 2018-07-29 4 United Kingdom Trip Verified
## 869 901 2018-07-29 1 Spain Trip Verified
## 870 902 2018-07-28 6 United Kingdom Trip Verified
## 871 903 2018-07-28 1 Lebanon Trip Verified
## 872 904 2018-07-28 1 United Kingdom Not Verified
## 873 905 2018-07-27 2 United States Trip Verified
## 874 906 2018-07-25 3 United Kingdom Not Verified
## 875 907 2018-07-24 1 United States Trip Verified
## 876 908 2018-07-24 1 United Kingdom Trip Verified
## 877 909 2018-07-22 1 United Kingdom Trip Verified
## 878 910 2018-07-19 2 United Kingdom Trip Verified
## 879 911 2018-07-19 1 United States Trip Verified
## 880 912 2018-07-18 3 United Kingdom Trip Verified
## 881 913 2018-07-18 1 Denmark Trip Verified
## 882 914 2018-07-17 2 United Kingdom Not Verified
## 883 915 2018-07-17 1 United Kingdom Trip Verified
## 884 916 2018-07-17 1 United Kingdom Trip Verified
## 885 918 2018-07-13 1 United States Trip Verified
## 886 919 2018-07-11 3 Ireland Trip Verified
## 887 920 2018-07-11 1 United Kingdom Trip Verified
## 888 921 2018-07-11 1 Italy Trip Verified
## 889 922 2018-07-09 1 India Trip Verified
## 890 923 2018-07-09 9 Belgium Trip Verified
## 891 924 2018-07-08 1 France Trip Verified
## 892 925 2018-07-08 1 United States Trip Verified
## 893 926 2018-07-08 1 United States Trip Verified
## 894 927 2018-07-06 1 United Kingdom Trip Verified
## 895 928 2018-07-05 1 United Kingdom Trip Verified
## 896 929 2018-07-05 3 United Kingdom Trip Verified
## 897 930 2018-07-03 1 United Kingdom Trip Verified
## 898 931 2018-07-03 2 Czech Republic Trip Verified
## 899 932 2018-07-02 1 United Kingdom Trip Verified
## 900 934 2018-07-01 1 Sweden Trip Verified
## 901 935 2018-07-01 1 United States Not Verified
## 902 936 2018-06-30 3 United Kingdom Trip Verified
## 903 937 2018-06-29 1 United States Trip Verified
## 904 938 2018-06-28 1 United Kingdom Trip Verified
## 905 939 2018-06-27 1 Spain Not Verified
## 906 940 2018-06-27 1 United Kingdom Not Verified
## 907 941 2018-06-25 1 Spain Trip Verified
## 908 942 2018-06-25 8 United Kingdom Trip Verified
## 909 943 2018-06-25 9 United Kingdom Trip Verified
## 910 944 2018-06-24 1 United States Trip Verified
## 911 945 2018-06-23 7 Germany Trip Verified
## 912 946 2018-06-23 1 Netherlands Trip Verified
## 913 947 2018-06-22 1 France Trip Verified
## 914 948 2018-06-19 5 India Trip Verified
## 915 949 2018-06-19 5 Italy Trip Verified
## 916 950 2018-06-18 1 Belgium Trip Verified
## 917 951 2018-06-17 1 United States Trip Verified
## 918 952 2018-06-15 1 Sweden Trip Verified
## 919 953 2018-06-15 6 Australia Trip Verified
## 920 954 2018-06-14 1 Romania Trip Verified
## 921 955 2018-06-13 8 Ireland Not Verified
## 922 956 2018-06-13 1 United States Trip Verified
## 923 957 2018-06-12 5 Portugal Trip Verified
## 924 958 2018-06-11 1 United Kingdom Trip Verified
## 925 959 2018-06-11 1 United Kingdom Trip Verified
## 926 960 2018-06-11 1 Canada Trip Verified
## 927 961 2018-06-10 1 United Kingdom Trip Verified
## 928 962 2018-06-10 1 United Kingdom Trip Verified
## 929 963 2018-06-10 6 United Kingdom Trip Verified
## 930 964 2018-06-08 1 Russian Federation Trip Verified
## 931 965 2018-06-05 1 United Kingdom Not Verified
## 932 966 2018-06-03 3 United States Not Verified
## 933 967 2018-06-02 1 United Kingdom Trip Verified
## 934 968 2018-06-01 1 United Kingdom Not Verified
## 935 969 2018-06-01 1 United Kingdom Trip Verified
## 936 970 2018-06-01 1 United Kingdom Trip Verified
## 937 971 2018-05-31 1 United Kingdom Trip Verified
## 938 972 2018-05-31 1 Australia Trip Verified
## 939 973 2018-05-29 2 United States Unknown
## 940 974 2018-05-28 1 Germany Trip Verified
## 941 975 2018-05-28 1 Ireland Trip Verified
## 942 976 2018-05-24 2 Australia Trip Verified
## 943 977 2018-05-23 1 United Kingdom Trip Verified
## 944 978 2018-05-23 1 Belgium Trip Verified
## 945 979 2018-05-22 3 India Trip Verified
## 946 980 2018-05-19 2 United Kingdom Trip Verified
## 947 981 2018-05-18 2 Italy Trip Verified
## 948 983 2018-05-14 4 United Kingdom Trip Verified
## 949 984 2018-05-13 7 Portugal Trip Verified
## 950 985 2018-05-13 9 Portugal Trip Verified
## 951 986 2018-05-11 9 United Kingdom Trip Verified
## 952 987 2018-05-10 3 United Kingdom Trip Verified
## 953 988 2018-05-09 1 United Kingdom Trip Verified
## 954 989 2018-05-04 1 Ireland Trip Verified
## 955 991 2018-04-24 1 Denmark Trip Verified
## 956 992 2018-04-24 9 United Kingdom Trip Verified
## 957 993 2018-04-24 10 United Kingdom Trip Verified
## 958 994 2018-04-22 1 United Kingdom Trip Verified
## 959 996 2018-04-20 8 Portugal Trip Verified
## 960 997 2018-04-20 10 Portugal Trip Verified
## 961 998 2018-04-20 1 Hungary Trip Verified
## 962 999 2018-04-18 8 Indonesia Trip Verified
## 963 1000 2018-04-18 5 United States Trip Verified
## 964 1001 2018-04-17 1 Italy Trip Verified
## 965 1002 2018-04-16 1 United Kingdom Trip Verified
## 966 1003 2018-04-11 1 United Kingdom Trip Verified
## 967 1004 2018-04-10 9 Ireland Trip Verified
## 968 1005 2018-04-10 4 Germany Trip Verified
## 969 1006 2018-04-09 1 United Kingdom Trip Verified
## 970 1007 2018-04-07 1 United States Trip Verified
## 971 1008 2018-04-06 9 Latvia Trip Verified
## 972 1009 2018-04-05 1 France Trip Verified
## 973 1010 2018-04-03 1 Israel Trip Verified
## 974 1011 2018-04-02 3 United Kingdom Trip Verified
## 975 1012 2018-04-02 9 Greece Trip Verified
## 976 1013 2018-04-01 1 United Kingdom Trip Verified
## 977 1014 2018-04-01 1 France Trip Verified
## 978 1015 2018-03-30 1 United Kingdom Trip Verified
## 979 1017 2018-03-21 10 Slovakia Trip Verified
## 980 1018 2018-03-20 1 United Kingdom Trip Verified
## 981 1019 2018-03-19 1 United Kingdom Trip Verified
## 982 1020 2018-03-16 1 Spain Trip Verified
## 983 1021 2018-03-16 1 Spain Trip Verified
## 984 1022 2018-03-14 1 United Kingdom Trip Verified
## 985 1023 2018-03-10 8 Ireland Trip Verified
## 986 1024 2018-03-10 1 United Kingdom Trip Verified
## 987 1025 2018-03-09 1 United Kingdom Trip Verified
## 988 1026 2018-03-06 1 United Kingdom Trip Verified
## 989 1027 2018-03-05 2 United Kingdom Trip Verified
## 990 1028 2018-03-03 10 Ireland Trip Verified
## 991 1029 2018-03-01 1 Ireland Trip Verified
## 992 1030 2018-02-24 7 Ireland Trip Verified
## 993 1031 2018-02-23 8 United Kingdom Trip Verified
## 994 1032 2018-02-23 8 Germany Trip Verified
## 995 1033 2018-02-20 1 United Kingdom Trip Verified
## 996 1034 2018-02-19 5 Spain Trip Verified
## 997 1035 2018-02-19 10 Ireland Trip Verified
## 998 1036 2018-02-18 4 United Kingdom Trip Verified
## 999 1037 2018-02-17 8 United Kingdom Trip Verified
## 1000 1038 2018-02-17 5 United Kingdom Trip Verified
## 1001 1039 2018-02-16 6 Ireland Trip Verified
## 1002 1040 2018-02-16 1 Greece Unknown
## 1003 1041 2018-02-09 2 United Kingdom Trip Verified
## 1004 1042 2018-02-04 1 United Kingdom Trip Verified
## 1005 1043 2018-02-03 8 Greece Trip Verified
## 1006 1044 2018-02-03 8 Greece Trip Verified
## 1007 1045 2018-02-03 1 Italy Trip Verified
## 1008 1046 2018-02-02 1 Israel Trip Verified
## 1009 1047 2018-01-30 8 United Kingdom Trip Verified
## 1010 1048 2018-01-30 1 Greece Trip Verified
## 1011 1049 2018-01-27 1 United States Not Verified
## 1012 1050 2018-01-27 1 Norway Trip Verified
## 1013 1052 2018-01-25 9 Germany Trip Verified
## 1014 1053 2018-01-24 1 Romania Trip Verified
## 1015 1054 2018-01-23 8 Chile Trip Verified
## 1016 1055 2018-01-23 3 United Kingdom Trip Verified
## 1017 1058 2018-01-17 5 Spain Trip Verified
## 1018 1059 2018-01-16 1 Lithuania Trip Verified
## 1019 1061 2018-01-16 8 Hong Kong Trip Verified
## 1020 1062 2018-01-15 1 United Kingdom Trip Verified
## 1021 1063 2018-01-14 1 Iceland Trip Verified
## 1022 1064 2018-01-14 2 United Kingdom Trip Verified
## 1023 1065 2018-01-13 4 United Kingdom Trip Verified
## 1024 1066 2018-01-10 2 United Kingdom Trip Verified
## 1025 1067 2018-01-09 1 United States Trip Verified
## 1026 1068 2018-01-07 8 Romania Trip Verified
## 1027 1069 2018-01-07 3 United Kingdom Trip Verified
## 1028 1070 2018-01-05 4 United Kingdom Trip Verified
## 1029 1071 2018-01-03 6 Portugal Trip Verified
## 1030 1072 2018-01-03 6 Italy Trip Verified
## 1031 1073 2017-12-30 1 United States Trip Verified
## 1032 1074 2017-12-30 1 Portugal Trip Verified
## 1033 1075 2017-12-28 1 United Kingdom Trip Verified
## 1034 1076 2017-12-25 1 Israel Trip Verified
## 1035 1077 2017-12-21 5 Italy Trip Verified
## 1036 1078 2017-12-20 7 Czech Republic Trip Verified
## 1037 1079 2017-12-18 1 Germany Trip Verified
## 1038 1080 2017-12-18 7 Sweden Trip Verified
## 1039 1081 2017-12-17 1 Malta Trip Verified
## 1040 1082 2017-12-16 4 Spain Trip Verified
## 1041 1083 2017-12-16 3 United Kingdom Trip Verified
## 1042 1084 2017-12-16 1 Germany Trip Verified
## 1043 1085 2017-12-14 1 United Kingdom Trip Verified
## 1044 1086 2017-12-12 5 Greece Trip Verified
## 1045 1087 2017-12-10 7 Greece Trip Verified
## 1046 1088 2017-12-03 1 United Kingdom Trip Verified
## 1047 1089 2017-12-03 1 United States Trip Verified
## 1048 1090 2017-11-25 1 United States Trip Verified
## 1049 1091 2017-11-23 1 United States Trip Verified
## 1050 1092 2017-11-23 1 United Kingdom Trip Verified
## 1051 1093 2017-11-22 1 United States Trip Verified
## 1052 1094 2017-11-22 2 United Kingdom Trip Verified
## 1053 1095 2017-11-21 1 Thailand Trip Verified
## 1054 1096 2017-11-21 10 United Kingdom Trip Verified
## 1055 1097 2017-11-20 1 Ireland Trip Verified
## 1056 1098 2017-11-19 2 Israel Trip Verified
## 1057 1099 2017-11-17 1 United Kingdom Trip Verified
## 1058 1100 2017-11-13 6 Ireland Verified Review
## 1059 1101 2017-11-11 7 Greece Verified Review
## 1060 1102 2017-11-10 10 United Kingdom Verified Review
## 1061 1103 2017-11-10 1 United Kingdom Verified Review
## 1062 1104 2017-11-06 1 Canada Verified Review
## 1063 1105 2017-11-05 1 United Kingdom Verified Review
## 1064 1106 2017-11-04 9 France Verified Review
## 1065 1107 2017-11-02 8 Ireland Verified Review
## 1066 1108 2017-11-02 3 Spain Verified Review
## 1067 1109 2017-11-01 2 United Kingdom Verified Review
## 1068 1110 2017-10-28 1 United Kingdom Verified Review
## 1069 1111 2017-10-27 1 Portugal Verified Review
## 1070 1112 2017-10-26 1 Romania Verified Review
## 1071 1113 2017-10-23 1 United Kingdom Verified Review
## 1072 1114 2017-10-22 1 Russian Federation Verified Review
## 1073 1115 2017-10-21 1 United Kingdom Verified Review
## 1074 1116 2017-10-20 1 United States Verified Review
## 1075 1117 2017-10-20 7 Australia Verified Review
## 1076 1118 2017-10-19 3 Hong Kong Verified Review
## 1077 1119 2017-10-19 1 United Kingdom Verified Review
## 1078 1120 2017-10-16 1 United Kingdom Verified Review
## 1079 1121 2017-10-15 1 United Kingdom Verified Review
## 1080 1122 2017-10-15 5 United Kingdom Verified Review
## 1081 1123 2017-10-13 8 United Kingdom Verified Review
## 1082 1124 2017-10-11 5 United Kingdom Verified Review
## 1083 1125 2017-10-09 10 United Kingdom Verified Review
## 1084 1126 2017-10-09 1 Australia Verified Review
## 1085 1127 2017-10-04 1 Kuwait Verified Review
## 1086 1128 2017-10-03 5 United Kingdom Verified Review
## 1087 1129 2017-10-02 2 United Kingdom Verified Review
## 1088 1130 2017-10-02 5 United States Verified Review
## 1089 1131 2017-10-02 1 Canada Verified Review
## 1090 1132 2017-09-27 3 Italy Verified Review
## 1091 1134 2017-09-26 4 United Kingdom Verified Review
## 1092 1135 2017-09-23 1 United Kingdom Verified Review
## 1093 1136 2017-09-19 10 New Zealand Verified Review
## 1094 1137 2017-09-19 1 United Kingdom Verified Review
## 1095 1138 2017-09-18 1 United Kingdom Verified Review
## 1096 1139 2017-09-16 1 United Kingdom Verified Review
## 1097 1140 2017-09-15 6 Italy Verified Review
## 1098 1141 2017-09-13 4 Ireland Verified Review
## 1099 1142 2017-09-10 1 United Kingdom Verified Review
## 1100 1143 2017-09-10 1 United Kingdom Verified Review
## 1101 1144 2017-09-10 5 Brazil Verified Review
## 1102 1145 2017-09-06 10 United Kingdom Verified Review
## 1103 1146 2017-09-05 9 United Kingdom Verified Review
## 1104 1147 2017-09-03 1 United Kingdom Verified Review
## 1105 1148 2017-09-02 7 Ireland Verified Review
## 1106 1149 2017-09-02 8 Ireland Verified Review
## 1107 1150 2017-08-31 1 United Kingdom Verified Review
## 1108 1151 2017-08-31 1 United Kingdom Verified Review
## 1109 1152 2017-08-29 1 Ireland Verified Review
## 1110 1153 2017-08-27 1 United Kingdom Verified Review
## 1111 1154 2017-08-26 1 United Kingdom Verified Review
## 1112 1155 2017-08-23 10 Italy Verified Review
## 1113 1156 2017-08-19 6 Poland Verified Review
## 1114 1157 2017-08-17 7 Ireland Verified Review
## 1115 1158 2017-08-13 1 Australia Verified Review
## 1116 1159 2017-08-10 7 United Kingdom Verified Review
## 1117 1160 2017-08-10 7 United Kingdom Verified Review
## 1118 1161 2017-08-09 9 United Kingdom Verified Review
## 1119 1162 2017-08-06 1 United Kingdom Verified Review
## 1120 1163 2017-08-03 9 United States Verified Review
## 1121 1164 2017-08-02 1 United Kingdom Verified Review
## 1122 1165 2017-08-02 7 Ireland Verified Review
## 1123 1166 2017-07-31 1 United Kingdom Verified Review
## 1124 1167 2017-07-30 1 United Kingdom Verified Review
## 1125 1168 2017-07-30 2 Sweden Verified Review
## 1126 1169 2017-07-30 1 United Kingdom Verified Review
## 1127 1170 2017-07-30 2 Ireland Verified Review
## 1128 1171 2017-07-28 1 Australia Verified Review
## 1129 1172 2017-07-28 1 United States Verified Review
## 1130 1173 2017-07-27 1 United States Verified Review
## 1131 1174 2017-07-26 10 United States Verified Review
## 1132 1175 2017-07-20 1 Iceland Verified Review
## 1133 1176 2017-07-17 1 United States Verified Review
## 1134 1177 2017-07-15 8 Greece Verified Review
## 1135 1178 2017-07-14 10 Ireland Verified Review
## 1136 1179 2017-07-07 1 New Zealand Verified Review
## 1137 1180 2017-07-07 6 United Kingdom Verified Review
## 1138 1181 2017-07-04 7 United Kingdom Verified Review
## 1139 1182 2017-06-30 1 United Kingdom Verified Review
## 1140 1183 2017-06-28 4 United Kingdom Verified Review
## 1141 1184 2017-06-27 7 Poland Verified Review
## 1142 1185 2017-06-27 1 Ireland Verified Review
## 1143 1186 2017-06-24 1 United Kingdom Verified Review
## 1144 1187 2017-06-23 1 United States Verified Review
## 1145 1188 2017-06-21 1 United Kingdom Verified Review
## 1146 1189 2017-06-20 3 United Kingdom Verified Review
## 1147 1190 2017-06-18 1 Singapore Verified Review
## 1148 1191 2017-06-16 1 United Kingdom Verified Review
## 1149 1192 2017-06-16 2 United Kingdom Verified Review
## 1150 1194 2017-06-13 1 United Kingdom Verified Review
## 1151 1195 2017-06-11 1 United Kingdom Verified Review
## 1152 1196 2017-06-11 8 Netherlands Verified Review
## 1153 1197 2017-06-08 3 United Kingdom Verified Review
## 1154 1198 2017-06-07 1 United Kingdom Verified Review
## 1155 1199 2017-06-05 1 United Kingdom Verified Review
## 1156 1200 2017-06-05 2 Netherlands Verified Review
## 1157 1201 2017-06-03 6 United Kingdom Verified Review
## 1158 1202 2017-06-02 1 United Kingdom Verified Review
## 1159 1203 2017-05-29 1 Ireland Verified Review
## 1160 1204 2017-05-28 9 Romania Verified Review
## 1161 1205 2017-05-25 7 United Kingdom Verified Review
## 1162 1206 2017-05-24 1 United Kingdom Verified Review
## 1163 1207 2017-05-24 1 Canada Verified Review
## 1164 1208 2017-05-18 10 Ireland Verified Review
## 1165 1209 2017-05-15 8 United Kingdom Verified Review
## 1166 1210 2017-05-15 8 United Kingdom Verified Review
## 1167 1211 2017-05-15 9 United Kingdom Verified Review
## 1168 1212 2017-05-08 4 Romania Verified Review
## 1169 1213 2017-04-29 9 Laos Verified Review
## 1170 1214 2017-04-25 5 United Kingdom Verified Review
## 1171 1215 2017-04-19 8 Laos Verified Review
## 1172 1216 2017-04-07 1 United Kingdom Verified Review
## 1173 1217 2017-04-05 10 Ireland Verified Review
## 1174 1218 2017-03-28 8 United Kingdom Verified Review
## 1175 1219 2017-03-28 1 United Kingdom Verified Review
## 1176 1220 2017-03-24 6 United Kingdom Verified Review
## 1177 1221 2017-03-20 1 United States Verified Review
## 1178 1222 2017-03-08 7 United Kingdom Verified Review
## 1179 1223 2017-03-05 7 United Kingdom Verified Review
## 1180 1224 2017-03-02 8 Portugal Verified Review
## 1181 1225 2017-03-01 8 Portugal Verified Review
## 1182 1226 2017-02-28 3 United Kingdom Unverified
## 1183 1228 2017-02-23 1 United States Verified Review
## 1184 1229 2017-02-20 10 Bulgaria Verified Review
## 1185 1230 2017-02-14 9 Portugal Verified Review
## 1186 1231 2017-02-13 9 Austria Verified Review
## 1187 1232 2017-02-08 9 United Kingdom Verified Review
## 1188 1233 2017-02-07 8 Greece Verified Review
## 1189 1234 2017-02-07 9 Ireland Unverified
## 1190 1235 2017-02-05 6 Portugal Verified Review
## 1191 1236 2017-02-04 7 Portugal Verified Review
## 1192 1237 2017-02-03 10 United Kingdom Verified Review
## 1193 1238 2017-02-02 10 United Kingdom Unverified
## 1194 1239 2017-01-30 3 United Kingdom Verified Review
## 1195 1240 2017-01-28 8 Greece Verified Review
## 1196 1241 2017-01-19 10 Spain Verified Review
## 1197 1242 2017-01-16 4 United Kingdom Verified Review
## 1198 1243 2017-01-09 9 Ireland Verified Review
## 1199 1244 2017-01-06 1 United Kingdom Verified Review
## 1200 1245 2017-01-04 3 United Kingdom Verified Review
## 1201 1246 2016-12-29 10 Portugal Verified Review
## 1202 1247 2016-12-22 3 United Kingdom Unknown
## 1203 1248 2016-12-21 9 United Kingdom Verified Review
## 1204 1249 2016-12-20 3 Spain Verified Review
## 1205 1250 2016-12-18 10 United Kingdom Unknown
## 1206 1251 2016-12-12 1 United States Verified Review
## 1207 1252 2016-12-09 10 United Kingdom Verified Review
## 1208 1253 2016-12-07 10 Sweden Unknown
## 1209 1255 2016-12-06 1 United Kingdom Unknown
## 1210 1256 2016-12-04 8 United Kingdom Verified Review
## 1211 1257 2016-12-03 9 United Kingdom Verified Review
## 1212 1258 2016-11-28 3 United Kingdom Verified Review
## 1213 1259 2016-11-28 7 United Kingdom Verified Review
## 1214 1260 2016-11-22 10 Jordan Verified Review
## 1215 1261 2016-11-22 8 United Kingdom Unknown
## 1216 1262 2016-11-22 9 United States Verified Review
## 1217 1263 2016-11-20 8 Portugal Verified Review
## 1218 1264 2016-11-20 8 Portugal Verified Review
## 1219 1265 2016-11-20 10 United Kingdom Verified Review
## 1220 1266 2016-11-20 8 Portugal Verified Review
## 1221 1267 2016-11-20 10 Portugal Verified Review
## 1222 1268 2016-11-19 9 United Kingdom Unknown
## 1223 1269 2016-11-18 8 United Kingdom Unknown
## 1224 1270 2016-11-16 2 Germany Verified Review
## 1225 1271 2016-11-15 9 Portugal Verified Review
## 1226 1272 2016-11-13 8 Portugal Verified Review
## 1227 1273 2016-11-13 10 Portugal Verified Review
## 1228 1274 2016-11-13 4 United States Verified Review
## 1229 1275 2016-11-07 9 United Kingdom Verified Review
## 1230 1276 2016-11-02 9 United Kingdom Unknown
## 1231 1277 2016-11-01 8 Indonesia Verified Review
## 1232 1278 2016-11-01 9 Lithuania Verified Review
## 1233 1279 2016-10-31 2 Australia Unknown
## 1234 1280 2016-10-29 10 United Kingdom Verified Review
## 1235 1281 2016-10-29 7 Qatar Verified Review
## 1236 1282 2016-10-28 1 South Africa Unknown
## 1237 1283 2016-10-26 4 United Kingdom Unknown
## 1238 1284 2016-10-24 9 United Kingdom Verified Review
## 1239 1285 2016-10-23 2 United Kingdom Unknown
## 1240 1286 2016-10-23 10 United Kingdom Verified Review
## 1241 1287 2016-10-21 7 Ireland Unknown
## 1242 1288 2016-10-21 8 Belgium Unknown
## 1243 1289 2016-10-20 4 United Kingdom Unknown
## 1244 1290 2016-10-20 1 United Kingdom Verified Review
## 1245 1291 2016-10-14 4 Italy Verified Review
## 1246 1292 2016-10-14 9 United Kingdom Unknown
## 1247 1293 2016-10-13 1 Ireland Verified Review
## 1248 1294 2016-10-13 6 United Kingdom Unknown
## 1249 1295 2016-10-13 8 Austria Unknown
## 1250 1296 2016-10-11 2 United Kingdom Unknown
## 1251 1297 2016-10-10 10 Austria Verified Review
## 1252 1298 2016-10-10 9 China Unknown
## 1253 1299 2016-10-09 7 Belgium Verified Review
## 1254 1300 2016-10-02 4 United Kingdom Unknown
## 1255 1301 2016-10-01 4 United Kingdom Unknown
## 1256 1302 2016-09-29 9 Netherlands Verified Review
## 1257 1303 2016-09-27 1 Ireland Unknown
## 1258 1304 2016-09-27 2 United Kingdom Unknown
## 1259 1305 2016-09-27 2 United Kingdom Verified Review
## 1260 1306 2016-09-23 8 Portugal Unknown
## 1261 1307 2016-09-23 1 Ireland Unknown
## 1262 1308 2016-09-21 6 United Kingdom Unknown
## 1263 1309 2016-09-19 2 Canada Unknown
## 1264 1310 2016-09-14 10 Ireland Unknown
## 1265 1311 2016-09-13 4 United Kingdom Unknown
## 1266 1312 2016-09-09 4 United Kingdom Unknown
## 1267 1313 2016-09-09 1 United Kingdom Verified Review
## 1268 1314 2016-09-04 7 United Kingdom Unknown
## 1269 1315 2016-08-29 1 United Kingdom Verified Review
## 1270 1316 2016-08-29 3 United Kingdom Verified Review
## 1271 1317 2016-08-27 10 United Kingdom Unknown
## 1272 1318 2016-08-25 3 United Kingdom Unknown
## 1273 1319 2016-08-23 1 United Kingdom Verified Review
## 1274 1320 2016-08-20 6 Germany Verified Review
## 1275 1321 2016-08-19 8 Germany Verified Review
## 1276 1322 2016-08-16 5 United Kingdom Unknown
## 1277 1323 2016-08-16 8 United Kingdom Verified Review
## 1278 1324 2016-08-15 9 United Kingdom Unknown
## 1279 1325 2016-08-13 10 Czech Republic Unknown
## 1280 1327 2016-08-10 8 Ireland Verified Review
## 1281 1328 2016-08-05 6 United Kingdom Verified Review
## 1282 1329 2016-07-26 1 United States Verified Review
## 1283 1330 2016-07-26 1 Singapore Verified Review
## 1284 1331 2016-07-21 8 United Kingdom Unknown
## 1285 1332 2016-07-20 1 United Kingdom Verified Review
## 1286 1333 2016-07-15 8 United Kingdom Unknown
## 1287 1334 2016-07-10 8 United Kingdom Unknown
## 1288 1335 2016-07-10 6 Netherlands Unknown
## 1289 1336 2016-07-05 8 United Kingdom Unknown
## 1290 1337 2016-07-04 1 United Kingdom Unknown
## 1291 1338 2016-07-04 9 United Kingdom Unknown
## 1292 1339 2016-07-04 1 United Kingdom Unknown
## 1293 1340 2016-06-30 1 Ireland Unknown
## 1294 1341 2016-06-29 7 United Kingdom Verified Review
## 1295 1342 2016-06-29 1 United States Unknown
## 1296 1343 2016-06-27 1 United States Unknown
## 1297 1344 2016-06-24 10 Australia Verified Review
## 1298 1345 2016-06-23 5 United Kingdom Verified Review
## 1299 1346 2016-06-13 7 United Kingdom Unknown
## 1300 1347 2016-06-06 8 United Kingdom Unknown
## 1301 1348 2016-06-05 9 Ukraine Verified Review
## 1302 1349 2016-06-02 7 Poland Unknown
## 1303 1350 2016-06-02 10 United Kingdom Verified Review
## 1304 1351 2016-06-02 9 United Kingdom Unknown
## 1305 1352 2016-05-31 8 United Kingdom Verified Review
## 1306 1353 2016-05-30 10 United Kingdom Unknown
## 1307 1354 2016-05-27 4 United Kingdom Verified Review
## 1308 1355 2016-05-27 7 United Kingdom Unknown
## 1309 1356 2016-05-24 7 United Kingdom Unknown
## 1310 1357 2016-05-23 3 United Kingdom Verified Review
## 1311 1358 2016-05-23 10 United Kingdom Unknown
## 1312 1359 2016-05-19 5 United Kingdom Unknown
## 1313 1360 2016-05-11 9 United Kingdom Unknown
## 1314 1361 2016-05-05 7 United Kingdom Verified Review
## 1315 1362 2016-05-03 10 Croatia Verified Review
## 1316 1363 2016-04-26 9 Ireland Unknown
## 1317 1364 2016-04-24 9 United Kingdom Unknown
## 1318 1365 2016-04-19 8 France Unknown
## 1319 1366 2016-04-13 9 United Kingdom Verified Review
## 1320 1367 2016-04-11 9 Greece Verified Review
## 1321 1368 2016-04-09 8 United Kingdom Verified Review
## 1322 1369 2016-04-03 1 Ireland Verified Review
## 1323 1370 2016-03-30 1 United Kingdom Unknown
## 1324 1371 2016-03-28 5 Gibraltar Verified Review
## 1325 1372 2016-03-23 10 United Kingdom Unknown
## 1326 1373 2016-03-22 9 Ireland Unknown
## 1327 1374 2016-03-18 2 United Kingdom Unknown
## 1328 1375 2016-03-15 9 Ireland Unknown
## 1329 1376 2016-03-15 8 Czech Republic Unknown
## 1330 1377 2016-03-14 9 Austria Unknown
## 1331 1378 2016-03-14 4 United Kingdom Unknown
## 1332 1379 2016-03-12 9 Portugal Unknown
## 1333 1380 2016-03-12 9 Spain Unknown
## 1334 1381 2016-03-11 5 Australia Unknown
## 1335 1382 2016-03-11 1 Ireland Unknown
## 1336 1383 2016-03-08 7 Japan Unknown
## 1337 1384 2016-03-07 8 Belgium Unknown
## 1338 1385 2016-03-02 9 United Kingdom Unknown
## 1339 1386 2016-03-02 1 Belgium Unknown
## 1340 1387 2016-02-29 10 Slovenia Unknown
## 1341 1388 2016-02-26 10 United Kingdom Unknown
## 1342 1389 2016-02-26 10 Ireland Unknown
## 1343 1390 2016-02-25 10 United Kingdom Unknown
## 1344 1391 2016-02-19 1 United Kingdom Unknown
## 1345 1392 2016-02-19 10 United Kingdom Unknown
## 1346 1393 2016-02-18 10 United Kingdom Unknown
## 1347 1394 2016-02-13 7 Denmark Unknown
## 1348 1395 2016-02-10 1 Belgium Unknown
## 1349 1396 2016-02-09 2 Spain Unknown
## 1350 1397 2016-02-08 7 United Kingdom Unknown
## 1351 1398 2016-02-07 6 China Unknown
## 1352 1399 2016-02-06 6 United Kingdom Unknown
## 1353 1400 2016-02-06 9 United Kingdom Unknown
## 1354 1401 2016-02-02 1 United Kingdom Unknown
## 1355 1402 2016-02-02 8 United Kingdom Unknown
## 1356 1403 2016-01-29 7 United Kingdom Unknown
## 1357 1404 2016-01-27 9 Ireland Unknown
## 1358 1405 2016-01-26 1 United Kingdom Unknown
## 1359 1406 2016-01-26 10 United Kingdom Unknown
## 1360 1407 2016-01-23 7 United Kingdom Unknown
## 1361 1408 2016-01-22 10 Australia Unknown
## 1362 1409 2016-01-22 7 United Kingdom Unknown
## 1363 1410 2016-01-19 1 Australia Unknown
## 1364 1411 2016-01-18 1 United States Unknown
## 1365 1412 2016-01-13 1 United Kingdom Unknown
## 1366 1413 2016-01-09 8 Spain Unknown
## 1367 1414 2016-01-08 1 United Kingdom Unknown
## 1368 1415 2016-01-07 1 Canada Unknown
## 1369 1416 2016-01-07 1 United Kingdom Unknown
## 1370 1417 2016-01-07 7 Singapore Unknown
## 1371 1418 2016-01-06 1 United Kingdom Unknown
## 1372 1419 2016-01-05 1 United Kingdom Unknown
## 1373 1420 2015-12-29 9 Belgium Unknown
## 1374 1421 2015-12-29 10 Netherlands Unknown
## 1375 1422 2015-12-26 1 Lithuania Unknown
## 1376 1423 2015-12-25 1 United Kingdom Unknown
## 1377 1424 2015-12-24 1 United Kingdom Unknown
## 1378 1425 2015-12-22 7 Italy Unknown
## 1379 1426 2015-12-21 7 Ireland Unknown
## 1380 1427 2015-12-20 1 United Kingdom Unknown
## 1381 1428 2015-12-20 8 Italy Unknown
## 1382 1429 2015-12-17 1 Australia Unknown
## 1383 1430 2015-12-17 9 United Kingdom Unknown
## 1384 1431 2015-12-17 7 Netherlands Unknown
## 1385 1432 2015-12-17 6 United Kingdom Unknown
## 1386 1433 2015-12-13 3 Ireland Unknown
## 1387 1434 2015-12-13 6 United Kingdom Unknown
## 1388 1435 2015-12-11 1 United States Unknown
## 1389 1436 2015-12-09 9 United Kingdom Unknown
## 1390 1437 2015-12-08 1 United Kingdom Unknown
## 1391 1438 2015-12-08 5 Belarus Unknown
## 1392 1439 2015-12-06 1 Slovakia Unknown
## 1393 1440 2015-12-06 5 United Kingdom Unknown
## 1394 1441 2015-12-03 5 Poland Unknown
## 1395 1442 2015-12-01 1 Belgium Unknown
## 1396 1443 2015-11-27 9 United Kingdom Unknown
## 1397 1444 2015-11-26 9 United Kingdom Unknown
## 1398 1445 2015-11-26 2 Canada Unknown
## 1399 1446 2015-11-25 1 United Kingdom Unknown
## 1400 1448 2015-11-24 1 United Kingdom Unknown
## 1401 1449 2015-11-21 10 United Kingdom Unknown
## 1402 1450 2015-11-20 7 United Kingdom Unknown
## 1403 1451 2015-11-19 10 United Kingdom Unknown
## 1404 1452 2015-11-18 1 United Kingdom Unknown
## 1405 1453 2015-11-16 6 Greece Unknown
## 1406 1454 2015-11-16 9 United Kingdom Unknown
## 1407 1455 2015-11-15 7 United Kingdom Unknown
## 1408 1457 2015-11-12 1 Australia Unknown
## 1409 1458 2015-11-12 8 United Kingdom Unknown
## 1410 1459 2015-11-09 9 Croatia Unknown
## 1411 1460 2015-11-09 7 United Kingdom Unknown
## 1412 1461 2015-11-06 1 Australia Unknown
## 1413 1462 2015-11-05 8 Belgium Unknown
## 1414 1463 2015-11-03 5 United Kingdom Unknown
## 1415 1464 2015-11-02 1 United Kingdom Unknown
## 1416 1465 2015-11-02 1 Canada Unknown
## 1417 1466 2015-11-02 6 Greece Unknown
## 1418 1467 2015-11-01 5 United Kingdom Unknown
## 1419 1469 2015-10-31 9 Romania Unknown
## 1420 1470 2015-10-30 1 United States Unknown
## 1421 1471 2015-10-30 6 Netherlands Unknown
## 1422 1472 2015-10-29 6 France Unknown
## 1423 1473 2015-10-29 1 Slovenia Unknown
## 1424 1474 2015-10-29 2 Spain Unknown
## 1425 1475 2015-10-27 5 United States Unknown
## 1426 1476 2015-10-26 3 United Kingdom Unknown
## 1427 1477 2015-10-26 3 United Kingdom Unknown
## 1428 1478 2015-10-26 6 United Kingdom Unknown
## 1429 1479 2015-10-24 5 United States Unknown
## 1430 1480 2015-10-23 3 United Kingdom Unknown
## 1431 1481 2015-10-23 2 United Kingdom Unknown
## 1432 1482 2015-10-23 3 United Kingdom Unknown
## 1433 1483 2015-10-22 10 United Kingdom Unknown
## 1434 1484 2015-10-21 3 Philippines Unknown
## 1435 1485 2015-10-20 9 United Kingdom Unknown
## 1436 1486 2015-10-19 9 United Kingdom Unknown
## 1437 1487 2015-10-18 6 United Kingdom Unknown
## 1438 1488 2015-10-17 8 United Kingdom Unknown
## 1439 1489 2015-10-16 1 United States Unknown
## 1440 1490 2015-10-14 1 United States Unknown
## 1441 1491 2015-10-14 2 Germany Unknown
## 1442 1492 2015-10-13 7 Spain Unknown
## 1443 1493 2015-10-12 1 United Kingdom Unknown
## 1444 1494 2015-10-12 2 United Kingdom Unknown
## 1445 1495 2015-10-12 10 United Kingdom Unknown
## 1446 1496 2015-10-11 1 United Kingdom Unknown
## 1447 1497 2015-10-11 7 Greece Unknown
## 1448 1498 2015-10-11 9 United Kingdom Unknown
## 1449 1499 2015-10-08 7 Ireland Unknown
## 1450 1500 2015-10-08 9 Belgium Unknown
## 1451 1501 2015-10-07 8 Ireland Unknown
## 1452 1502 2015-10-07 1 Australia Unknown
## 1453 1503 2015-10-07 1 Canada Unknown
## 1454 1504 2015-10-07 4 United Kingdom Unknown
## 1455 1505 2015-10-07 2 Ireland Unknown
## 1456 1506 2015-10-06 1 Argentina Unknown
## 1457 1507 2015-10-04 3 Australia Unknown
## 1458 1508 2015-10-04 5 United Kingdom Unknown
## 1459 1509 2015-10-04 3 United States Unknown
## 1460 1510 2015-10-04 9 China Unknown
## 1461 1511 2015-10-03 3 Pakistan Unknown
## 1462 1512 2015-10-02 10 United Kingdom Unknown
## 1463 1513 2015-10-02 2 New Zealand Unknown
## 1464 1514 2015-10-01 10 United Kingdom Unknown
## 1465 1515 2015-10-01 5 United Kingdom Unknown
## 1466 1516 2015-09-30 1 United Kingdom Unknown
## 1467 1517 2015-09-29 10 United Kingdom Unknown
## 1468 1518 2015-09-29 9 United Kingdom Unknown
## 1469 1519 2015-09-29 8 Spain Unknown
## 1470 1520 2015-09-28 10 Ireland Unknown
## 1471 1521 2015-09-28 7 Ireland Unknown
## 1472 1523 2015-09-26 3 United Kingdom Unknown
## 1473 1524 2015-09-26 3 United Kingdom Unknown
## 1474 1526 2015-09-23 8 United Kingdom Unknown
## 1475 1527 2015-09-23 1 United Kingdom Unknown
## 1476 1528 2015-09-23 6 Ireland Unknown
## 1477 1529 2015-09-23 1 Denmark Unknown
## 1478 1530 2015-09-21 6 Germany Unknown
## 1479 1531 2015-09-20 10 United Kingdom Unknown
## 1480 1532 2015-09-19 6 United States Unknown
## 1481 1533 2015-09-19 9 Spain Unknown
## 1482 1534 2015-09-19 1 Spain Unknown
## 1483 1535 2015-09-19 1 United Kingdom Unknown
## 1484 1536 2015-09-19 8 Italy Unknown
## 1485 1537 2015-09-18 1 United Kingdom Unknown
## 1486 1538 2015-09-17 6 United Kingdom Unknown
## 1487 1539 2015-09-17 6 Spain Unknown
## 1488 1540 2015-09-17 2 United Kingdom Unknown
## 1489 1541 2015-09-16 10 United Kingdom Unknown
## 1490 1542 2015-09-16 5 Canada Unknown
## 1491 1543 2015-09-16 1 United Kingdom Unknown
## 1492 1544 2015-09-15 7 United Kingdom Unknown
## 1493 1545 2015-09-15 2 Ireland Unknown
## 1494 1546 2015-09-15 1 United Kingdom Unknown
## 1495 1547 2015-09-14 1 United Kingdom Unknown
## 1496 1548 2015-09-13 1 United Kingdom Unknown
## 1497 1549 2015-09-10 1 United States Unknown
## 1498 1550 2015-09-09 1 Turkey Unknown
## 1499 1551 2015-09-07 1 United Kingdom Unknown
## 1500 1552 2015-09-06 1 United Kingdom Unknown
## 1501 1553 2015-09-06 2 United States Unknown
## 1502 1554 2015-09-05 2 Ireland Unknown
## 1503 1555 2015-09-04 1 United Kingdom Unknown
## 1504 1556 2015-09-04 1 Germany Unknown
## 1505 1557 2015-09-04 6 United Kingdom Unknown
## 1506 1558 2015-09-03 1 Canada Unknown
## 1507 1559 2015-09-03 2 United Kingdom Unknown
## 1508 1560 2015-09-01 1 United Kingdom Unknown
## 1509 1561 2015-09-01 1 United Kingdom Unknown
## 1510 1562 2015-08-29 8 United Kingdom Unknown
## 1511 1563 2015-08-28 1 United Kingdom Unknown
## 1512 1564 2015-08-28 10 Belgium Unknown
## 1513 1565 2015-08-27 10 Italy Unknown
## 1514 1566 2015-08-27 1 Sweden Unknown
## 1515 1567 2015-08-27 2 India Unknown
## 1516 1568 2015-08-27 9 United Kingdom Unknown
## 1517 1569 2015-08-26 8 France Unknown
## 1518 1570 2015-08-25 7 United Kingdom Unknown
## 1519 1571 2015-08-23 10 United Kingdom Unknown
## 1520 1572 2015-08-22 1 United Kingdom Unknown
## 1521 1573 2015-08-21 9 United Kingdom Unknown
## 1522 1574 2015-08-20 9 United Kingdom Unknown
## 1523 1575 2015-08-19 8 United Kingdom Unknown
## 1524 1576 2015-08-16 1 United States Unknown
## 1525 1577 2015-08-16 8 Germany Unknown
## 1526 1578 2015-08-15 5 United Kingdom Unknown
## 1527 1579 2015-08-15 2 United Kingdom Unknown
## 1528 1581 2015-08-12 8 Netherlands Unknown
## 1529 1582 2015-08-12 9 Netherlands Unknown
## 1530 1583 2015-08-11 2 United Kingdom Unknown
## 1531 1584 2015-08-11 2 United Kingdom Unknown
## 1532 1585 2015-08-11 9 United Kingdom Unknown
## 1533 1586 2015-08-10 10 United Kingdom Unknown
## 1534 1587 2015-08-10 8 United Kingdom Unknown
## 1535 1588 2015-08-09 9 Poland Unknown
## 1536 1589 2015-08-06 9 Ireland Unknown
## 1537 1590 2015-08-06 7 United Kingdom Unknown
## 1538 1591 2015-08-05 1 United Kingdom Unknown
## 1539 1592 2015-07-30 7 United Kingdom Unknown
## 1540 1593 2015-07-30 10 United States Unknown
## 1541 1594 2015-07-24 7 United Kingdom Unknown
## 1542 1595 2015-07-23 1 Belgium Unknown
## 1543 1596 2015-07-23 9 Ireland Unknown
## 1544 1597 2015-07-23 7 United Kingdom Unknown
## 1545 1598 2015-07-22 8 Switzerland Unknown
## 1546 1599 2015-07-22 2 Australia Unknown
## 1547 1600 2015-07-21 9 United Kingdom Unknown
## 1548 1601 2015-07-20 2 France Unknown
## 1549 1602 2015-07-17 7 United Kingdom Unknown
## 1550 1603 2015-07-15 6 Canada Unknown
## 1551 1604 2015-07-14 1 United Kingdom Unknown
## 1552 1605 2015-07-14 10 Belarus Unknown
## 1553 1606 2015-07-14 9 Italy Unknown
## 1554 1607 2015-07-14 3 United Kingdom Unknown
## 1555 1608 2015-07-13 7 Germany Unknown
## 1556 1609 2015-07-13 4 United Kingdom Unknown
## 1557 1610 2015-07-11 1 Brunei Unknown
## 1558 1611 2015-07-11 10 Canada Unknown
## 1559 1612 2015-07-10 1 United States Unknown
## 1560 1613 2015-07-10 1 United Kingdom Unknown
## 1561 1614 2015-07-06 1 United States Unknown
## 1562 1615 2015-07-06 1 United States Unknown
## 1563 1616 2015-07-04 2 United Kingdom Unknown
## 1564 1617 2015-07-04 10 United Kingdom Unknown
## 1565 1618 2015-07-03 1 United Kingdom Unknown
## 1566 1619 2015-07-03 9 Canada Unknown
## 1567 1620 2015-06-29 4 United States Unknown
## 1568 1621 2015-06-29 5 United Kingdom Unknown
## 1569 1622 2015-06-29 2 United Kingdom Unknown
## 1570 1624 2015-06-28 10 United Kingdom Unknown
## 1571 1625 2015-06-27 2 United Kingdom Unknown
## 1572 1626 2015-06-18 5 Greece Unknown
## 1573 1627 2015-06-14 10 Spain Unknown
## 1574 1628 2015-06-13 10 United Kingdom Unknown
## 1575 1629 2015-06-13 2 United Kingdom Unknown
## 1576 1630 2015-06-13 1 United Kingdom Unknown
## 1577 1631 2015-06-13 2 Poland Unknown
## 1578 1632 2015-06-13 4 United Kingdom Unknown
## 1579 1633 2015-06-13 6 United Kingdom Unknown
## 1580 1634 2015-06-11 8 United Kingdom Unknown
## 1581 1635 2015-06-06 1 United Kingdom Unknown
## 1582 1636 2015-06-06 1 United States Unknown
## 1583 1637 2015-06-04 1 United Kingdom Unknown
## 1584 1638 2015-06-04 2 United Kingdom Unknown
## 1585 1639 2015-06-01 4 Belgium Unknown
## 1586 1640 2015-06-01 7 Ukraine Unknown
## 1587 1641 2015-06-01 5 Singapore Unknown
## 1588 1642 2015-05-31 8 Austria Unknown
## 1589 1644 2015-05-31 2 United Kingdom Unknown
## 1590 1645 2015-05-31 9 United Kingdom Unknown
## 1591 1646 2015-05-31 9 Slovakia Unknown
## 1592 1647 2015-05-29 9 United Kingdom Unknown
## 1593 1648 2015-05-29 8 Spain Unknown
## 1594 1649 2015-05-29 10 United Kingdom Unknown
## 1595 1650 2015-05-28 6 United Kingdom Unknown
## 1596 1651 2015-05-28 8 United Kingdom Unknown
## 1597 1652 2015-05-27 1 South Africa Unknown
## 1598 1653 2015-05-25 1 United Kingdom Unknown
## 1599 1654 2015-05-25 8 Italy Unknown
## 1600 1655 2015-05-22 7 United Kingdom Unknown
## 1601 1656 2015-05-20 9 United Kingdom Unknown
## 1602 1657 2015-05-18 2 Spain Unknown
## 1603 1658 2015-05-18 1 United Kingdom Unknown
## 1604 1659 2015-05-18 2 United Kingdom Unknown
## 1605 1660 2015-05-18 5 United Kingdom Unknown
## 1606 1661 2015-05-16 8 Costa Rica Unknown
## 1607 1662 2015-05-16 8 United Kingdom Unknown
## 1608 1663 2015-05-13 7 Ireland Unknown
## 1609 1664 2015-05-13 8 Ireland Unknown
## 1610 1666 2015-05-13 1 United States Unknown
## 1611 1667 2015-05-10 10 United Kingdom Unknown
## 1612 1668 2015-05-08 8 France Unknown
## 1613 1669 2015-05-08 10 United Kingdom Unknown
## 1614 1670 2015-05-08 1 United Kingdom Unknown
## 1615 1671 2015-05-05 2 United Kingdom Unknown
## 1616 1672 2015-05-02 3 United Kingdom Unknown
## 1617 1673 2015-05-02 9 Netherlands Unknown
## 1618 1675 2015-05-01 8 United Kingdom Unknown
## 1619 1676 2015-05-01 8 United Kingdom Unknown
## 1620 1677 2015-05-01 8 United Kingdom Unknown
## 1621 1679 2015-04-28 3 United Kingdom Unknown
## 1622 1680 2015-04-27 5 United Kingdom Unknown
## 1623 1681 2015-04-27 5 United Kingdom Unknown
## 1624 1683 2015-04-23 3 United Kingdom Unknown
## 1625 1684 2015-04-23 2 United Kingdom Unknown
## 1626 1685 2015-04-22 8 Ireland Unknown
## 1627 1687 2015-04-19 10 United Kingdom Unknown
## 1628 1688 2015-04-17 2 United Kingdom Unknown
## 1629 1689 2015-04-14 8 United States Unknown
## 1630 1690 2015-04-14 10 United Kingdom Unknown
## 1631 1691 2015-04-14 7 United Kingdom Unknown
## 1632 1692 2015-04-12 9 United Kingdom Unknown
## 1633 1693 2015-04-12 8 Luxembourg Unknown
## 1634 1694 2015-04-10 10 Sri Lanka Unknown
## 1635 1695 2015-04-10 1 United Kingdom Unknown
## 1636 1696 2015-04-04 1 United Kingdom Unknown
## 1637 1697 2015-04-01 10 United Kingdom Unknown
## 1638 1698 2015-03-30 9 Spain Unknown
## 1639 1699 2015-03-28 10 United Kingdom Unknown
## 1640 1700 2015-03-28 9 Norway Unknown
## 1641 1702 2015-03-23 6 Ukraine Unknown
## 1642 1703 2015-03-23 10 United Kingdom Unknown
## 1643 1704 2015-03-23 8 United Kingdom Unknown
## 1644 1705 2015-03-23 8 United Kingdom Unknown
## 1645 1706 2015-03-23 8 United Kingdom Unknown
## 1646 1707 2015-03-20 5 United Kingdom Unknown
## 1647 1708 2015-03-17 10 United Kingdom Unknown
## 1648 1709 2015-03-17 10 United Kingdom Unknown
## 1649 1710 2015-03-17 5 United Kingdom Unknown
## 1650 1711 2015-03-17 1 United Kingdom Unknown
## 1651 1712 2015-03-04 10 Ireland Unknown
## 1652 1713 2015-03-04 6 United Kingdom Unknown
## 1653 1714 2015-03-04 4 United Kingdom Unknown
## 1654 1716 2015-03-04 3 United Kingdom Unknown
## 1655 1717 2015-02-24 10 France Unknown
## 1656 1718 2015-02-24 9 United Kingdom Unknown
## 1657 1721 2015-02-18 2 France Unknown
## 1658 1722 2015-02-18 10 United Kingdom Unknown
## 1659 1723 2015-02-12 7 United Kingdom Unknown
## 1660 1724 2015-02-12 6 United Kingdom Unknown
## 1661 1725 2015-02-06 10 Spain Unknown
## 1662 1726 2015-02-06 9 United Kingdom Unknown
## 1663 1727 2015-01-28 8 Australia Unknown
## 1664 1728 2015-01-28 4 United Kingdom Unknown
## 1665 1729 2015-01-26 7 Canada Unknown
## 1666 1730 2015-01-26 2 United Kingdom Unknown
## 1667 1731 2015-01-23 6 United Kingdom Unknown
## 1668 1732 2015-01-21 10 United Kingdom Unknown
## 1669 1734 2015-01-21 9 United Kingdom Unknown
## 1670 1736 2015-01-19 4 United Kingdom Unknown
## 1671 1737 2015-01-19 10 United Kingdom Unknown
## 1672 1738 2015-01-14 5 United Kingdom Unknown
## 1673 1739 2015-01-14 6 United Kingdom Unknown
## 1674 1740 2015-01-14 10 United Kingdom Unknown
## 1675 1741 2015-01-14 7 United Kingdom Unknown
## 1676 1743 2015-01-05 8 United Kingdom Unknown
## 1677 1744 2014-12-31 2 United Kingdom Unknown
## 1678 1745 2014-12-31 5 United States Unknown
## 1679 1746 2014-12-22 10 Greece Unknown
## 1680 1747 2014-12-22 8 United Kingdom Unknown
## 1681 1748 2014-12-22 8 France Unknown
## 1682 1749 2014-12-18 10 United Kingdom Unknown
## 1683 1750 2014-12-18 10 United Kingdom Unknown
## 1684 1751 2014-12-10 9 United Kingdom Unknown
## 1685 1752 2014-12-10 9 United Kingdom Unknown
## 1686 1754 2014-12-04 10 United Kingdom Unknown
## 1687 1756 2014-12-04 9 United Kingdom Unknown
## 1688 1757 2014-12-01 6 United Kingdom Unknown
## 1689 1758 2014-11-25 5 United Kingdom Unknown
## 1690 1759 2014-11-25 7 Spain Unknown
## 1691 1760 2014-11-20 1 United Kingdom Unknown
## 1692 1761 2014-11-20 9 United Kingdom Unknown
## 1693 1762 2014-11-20 7 United Kingdom Unknown
## 1694 1763 2014-11-20 9 United Kingdom Unknown
## 1695 1764 2014-11-17 10 Australia Unknown
## 1696 1765 2014-11-17 9 United Kingdom Unknown
## 1697 1766 2014-11-12 7 United Kingdom Unknown
## 1698 1767 2014-11-11 8 Ireland Unknown
## 1699 1768 2014-11-06 3 United Kingdom Unknown
## 1700 1769 2014-11-06 10 United Kingdom Unknown
## 1701 1770 2014-11-06 1 United Kingdom Unknown
## 1702 1771 2014-11-03 10 United Kingdom Unknown
## 1703 1772 2014-11-03 3 United Kingdom Unknown
## 1704 1773 2014-11-03 10 United Kingdom Unknown
## 1705 1774 2014-11-03 10 United Kingdom Unknown
## 1706 1776 2014-10-31 6 Ireland Unknown
## 1707 1778 2014-10-28 9 United Kingdom Unknown
## 1708 1779 2014-10-28 6 United Kingdom Unknown
## 1709 1780 2014-10-28 9 Spain Unknown
## 1710 1782 2014-10-28 9 Australia Unknown
## 1711 1784 2014-10-28 8 United Kingdom Unknown
## 1712 1785 2014-10-22 8 United Kingdom Unknown
## 1713 1786 2014-10-22 8 United Kingdom Unknown
## 1714 1787 2014-10-22 2 United Kingdom Unknown
## 1715 1788 2014-10-22 7 United Kingdom Unknown
## 1716 1789 2014-10-22 10 United Kingdom Unknown
## 1717 1790 2014-10-22 10 United Kingdom Unknown
## 1718 1791 2014-10-22 8 United Kingdom Unknown
## 1719 1792 2014-10-13 8 Germany Unknown
## 1720 1793 2014-10-13 5 India Unknown
## 1721 1794 2014-10-13 10 United Kingdom Unknown
## 1722 1795 2014-10-08 10 United Kingdom Unknown
## 1723 1796 2014-10-08 10 United Kingdom Unknown
## 1724 1797 2014-10-08 10 United Kingdom Unknown
## 1725 1799 2014-10-08 1 United States Unknown
## 1726 1800 2014-10-05 2 Ireland Unknown
## 1727 1802 2014-10-05 2 United Kingdom Unknown
## 1728 1803 2014-10-05 5 United Kingdom Unknown
## 1729 1804 2014-10-05 8 Ireland Unknown
## 1730 1806 2014-10-05 9 Ireland Unknown
## 1731 1808 2014-10-01 9 United Kingdom Unknown
## 1732 1809 2014-10-01 10 Romania Unknown
## 1733 1810 2014-09-28 2 United Kingdom Unknown
## 1734 1812 2014-09-22 10 United Kingdom Unknown
## 1735 1813 2014-09-22 9 United Kingdom Unknown
## 1736 1814 2014-09-22 2 United Kingdom Unknown
## 1737 1815 2014-09-22 8 United Kingdom Unknown
## 1738 1817 2014-09-19 10 United Kingdom Unknown
## 1739 1818 2014-09-19 10 United Kingdom Unknown
## 1740 1819 2014-09-19 8 United Kingdom Unknown
## 1741 1821 2014-09-17 10 United Kingdom Unknown
## 1742 1823 2014-09-17 1 Ireland Unknown
## 1743 1824 2014-09-17 8 United Kingdom Unknown
## 1744 1827 2014-09-14 3 United Kingdom Unknown
## 1745 1829 2014-09-14 9 United Kingdom Unknown
## 1746 1830 2014-09-14 7 United Kingdom Unknown
## 1747 1831 2014-09-10 10 United Kingdom Unknown
## 1748 1832 2014-09-10 8 Australia Unknown
## 1749 1833 2014-09-06 5 United Kingdom Unknown
## 1750 1834 2014-09-06 2 United Kingdom Unknown
## 1751 1835 2014-09-06 10 Ireland Unknown
## 1752 1837 2014-09-01 9 United Kingdom Unknown
## 1753 1839 2014-09-01 7 United Kingdom Unknown
## 1754 1840 2014-09-01 5 United Kingdom Unknown
## 1755 1842 2014-09-01 10 United Kingdom Unknown
## 1756 1843 2014-08-28 7 United Kingdom Unknown
## 1757 1846 2014-08-28 10 United Kingdom Unknown
## 1758 1847 2014-08-26 6 United Kingdom Unknown
## 1759 1848 2014-08-26 8 United Kingdom Unknown
## 1760 1849 2014-08-26 8 United Kingdom Unknown
## 1761 1850 2014-08-26 5 United Kingdom Unknown
## 1762 1853 2014-08-20 5 United Kingdom Unknown
## 1763 1855 2014-08-20 8 United Kingdom Unknown
## 1764 1857 2014-08-20 10 United Kingdom Unknown
## 1765 1858 2014-08-20 10 United Kingdom Unknown
## 1766 1860 2014-08-20 6 Italy Unknown
## 1767 1861 2014-08-20 7 United Kingdom Unknown
## 1768 1863 2014-08-20 8 United Kingdom Unknown
## 1769 1864 2014-08-15 7 United Kingdom Unknown
## 1770 1865 2014-08-15 10 United Kingdom Unknown
## 1771 1866 2014-08-14 7 United Kingdom Unknown
## 1772 1867 2014-08-14 8 Ireland Unknown
## 1773 1868 2014-08-14 9 United Kingdom Unknown
## 1774 1869 2014-08-14 7 Netherlands Unknown
## 1775 1870 2014-08-11 7 United Kingdom Unknown
## 1776 1871 2014-08-08 1 United Kingdom Unknown
## 1777 1873 2014-08-08 1 United States Unknown
## 1778 1876 2014-08-06 8 United Kingdom Unknown
## 1779 1877 2014-08-03 8 United Kingdom Unknown
## 1780 1878 2014-08-03 10 United Kingdom Unknown
## 1781 1879 2014-07-31 7 United Kingdom Unknown
## 1782 1880 2014-07-31 4 United Kingdom Unknown
## 1783 1881 2014-07-31 5 Netherlands Unknown
## 1784 1882 2014-07-31 4 United Kingdom Unknown
## 1785 1883 2014-07-29 10 United Kingdom Unknown
## 1786 1884 2014-07-29 7 Belgium Unknown
## 1787 1885 2014-07-29 2 United Kingdom Unknown
## 1788 1886 2014-07-29 10 United Kingdom Unknown
## 1789 1887 2014-07-27 2 United Kingdom Unknown
## 1790 1888 2014-07-27 10 United Kingdom Unknown
## 1791 1890 2014-07-27 10 United Kingdom Unknown
## 1792 1891 2014-07-27 9 Finland Unknown
## 1793 1892 2014-07-20 10 United Kingdom Unknown
## 1794 1893 2014-07-17 3 United Kingdom Unknown
## 1795 1894 2014-07-17 8 United Kingdom Unknown
## 1796 1895 2014-07-17 9 United Kingdom Unknown
## 1797 1896 2014-07-17 7 Romania Unknown
## 1798 1897 2014-07-17 10 United Kingdom Unknown
## 1799 1899 2014-07-17 8 Spain Unknown
## 1800 1900 2014-07-17 1 United Kingdom Unknown
## 1801 1902 2014-07-13 10 United Kingdom Unknown
## 1802 1907 2014-07-06 10 Belgium Unknown
## 1803 1908 2014-07-03 10 United Kingdom Unknown
## 1804 1909 2014-07-03 5 United Kingdom Unknown
## 1805 1911 2014-07-01 7 South Africa Unknown
## 1806 1912 2014-07-01 2 Ireland Unknown
## 1807 1913 2014-07-01 9 United Kingdom Unknown
## 1808 1918 2014-06-25 10 Lithuania Unknown
## 1809 1919 2014-06-23 2 United Kingdom Unknown
## 1810 1922 2014-06-20 10 United Kingdom Unknown
## 1811 1925 2014-06-18 1 United Kingdom Unknown
## 1812 1926 2014-06-18 1 United Kingdom Unknown
## 1813 1928 2014-06-13 9 United Kingdom Unknown
## 1814 1929 2014-06-13 8 United Kingdom Unknown
## 1815 1930 2014-06-10 9 United Kingdom Unknown
## 1816 1931 2014-06-10 9 Luxembourg Unknown
## 1817 1932 2014-06-10 8 United Kingdom Unknown
## 1818 1933 2014-06-10 5 United Kingdom Unknown
## 1819 1935 2014-06-08 8 United Kingdom Unknown
## 1820 1936 2014-06-08 4 United Kingdom Unknown
## 1821 1937 2014-06-05 2 United Kingdom Unknown
## 1822 1938 2014-06-05 10 Ireland Unknown
## 1823 1940 2014-06-04 10 United Kingdom Unknown
## 1824 1942 2014-06-04 8 Ireland Unknown
## 1825 1943 2014-06-03 8 United Kingdom Unknown
## 1826 1944 2014-06-02 8 United Kingdom Unknown
## 1827 1945 2014-06-02 8 United Kingdom Unknown
## 1828 1946 2014-05-29 2 Canada Unknown
## 1829 1947 2014-05-28 7 United Kingdom Unknown
## 1830 1948 2014-05-28 9 United Kingdom Unknown
## 1831 1949 2014-05-28 9 United Kingdom Unknown
## 1832 1950 2014-05-28 1 United Kingdom Unknown
## 1833 1951 2014-05-27 10 United Kingdom Unknown
## 1834 1953 2014-05-26 4 United Kingdom Unknown
## 1835 1954 2014-05-26 7 United Kingdom Unknown
## 1836 1955 2014-05-26 8 United Kingdom Unknown
## 1837 1956 2014-05-25 2 United Kingdom Unknown
## 1838 1957 2014-05-25 2 United Kingdom Unknown
## 1839 1958 2014-05-24 1 Ireland Unknown
## 1840 1959 2014-05-21 9 United Kingdom Unknown
## 1841 1960 2014-05-21 5 United Kingdom Unknown
## 1842 1961 2014-05-21 2 United Kingdom Unknown
## 1843 1962 2014-05-20 3 Philippines Unknown
## 1844 1963 2014-05-18 3 United Kingdom Unknown
## 1845 1964 2014-05-18 6 United Kingdom Unknown
## 1846 1965 2014-05-17 3 United Kingdom Unknown
## 1847 1966 2014-05-17 9 United Kingdom Unknown
## 1848 1967 2014-05-17 1 United Kingdom Unknown
## 1849 1968 2014-05-17 2 United Kingdom Unknown
## 1850 1969 2014-05-16 3 United Kingdom Unknown
## 1851 1970 2014-05-16 4 United Kingdom Unknown
## 1852 1971 2014-05-12 3 United Kingdom Unknown
## 1853 1972 2014-05-11 9 Netherlands Unknown
## 1854 1974 2014-05-11 7 United Kingdom Unknown
## 1855 1975 2014-05-11 10 France Unknown
## 1856 1976 2014-05-11 10 United Kingdom Unknown
## 1857 1977 2014-05-10 10 United Kingdom Unknown
## 1858 1978 2014-05-10 8 United Kingdom Unknown
## 1859 1980 2014-05-08 4 United Kingdom Unknown
## 1860 1981 2014-05-07 10 United Kingdom Unknown
## 1861 1982 2014-05-05 6 United Kingdom Unknown
## 1862 1983 2014-05-01 7 United Kingdom Unknown
## 1863 1984 2014-05-01 10 Spain Unknown
## 1864 1985 2014-05-01 7 United Kingdom Unknown
## 1865 1987 2014-04-30 9 Portugal Unknown
## 1866 1988 2014-04-30 8 United Kingdom Unknown
## 1867 1991 2014-04-28 10 United Kingdom Unknown
## 1868 1993 2014-04-27 10 United Kingdom Unknown
## 1869 1994 2014-04-27 10 United Kingdom Unknown
## 1870 1995 2014-04-27 5 United Kingdom Unknown
## 1871 1996 2014-04-25 2 Netherlands Unknown
## 1872 1998 2014-04-24 8 United Kingdom Unknown
## 1873 2000 2014-04-23 1 Belgium Unknown
## 1874 2001 2014-04-23 10 United Kingdom Unknown
## 1875 2002 2014-04-23 1 United Kingdom Unknown
## 1876 2003 2014-04-23 10 United Kingdom Unknown
## 1877 2004 2014-04-22 4 United Kingdom Unknown
## 1878 2005 2014-04-22 10 United Kingdom Unknown
## 1879 2008 2014-04-22 10 Greece Unknown
## 1880 2009 2014-04-22 9 Poland Unknown
## 1881 2010 2014-04-21 10 United Kingdom Unknown
## 1882 2013 2014-04-16 5 United Kingdom Unknown
## 1883 2014 2014-04-15 9 United Kingdom Unknown
## 1884 2015 2014-04-14 5 United Kingdom Unknown
## 1885 2016 2014-04-14 10 United Kingdom Unknown
## 1886 2017 2014-04-13 10 United Kingdom Unknown
## 1887 2018 2014-04-13 9 United Kingdom Unknown
## 1888 2019 2014-04-11 10 United Kingdom Unknown
## 1889 2022 2014-04-08 10 United Kingdom Unknown
## 1890 2023 2014-04-08 5 Ireland Unknown
## 1891 2024 2014-04-08 7 United Kingdom Unknown
## 1892 2025 2014-04-08 10 United Kingdom Unknown
## 1893 2026 2014-04-07 10 United Kingdom Unknown
## 1894 2029 2014-03-31 3 United Kingdom Unknown
## 1895 2030 2014-03-31 8 United Kingdom Unknown
## 1896 2031 2014-03-31 8 Lithuania Unknown
## 1897 2032 2014-03-30 1 United Kingdom Unknown
## 1898 2033 2014-03-30 8 Singapore Unknown
## 1899 2034 2014-03-28 1 United Kingdom Unknown
## 1900 2035 2014-03-27 5 United Kingdom Unknown
## 1901 2036 2014-03-26 7 Ireland Unknown
## 1902 2037 2014-03-26 10 United Kingdom Unknown
## 1903 2038 2014-03-24 10 United Kingdom Unknown
## 1904 2039 2014-03-24 8 United Kingdom Unknown
## 1905 2040 2014-03-21 10 United Kingdom Unknown
## 1906 2043 2014-03-19 8 Spain Unknown
## 1907 2044 2014-03-14 6 United Kingdom Unknown
## 1908 2045 2014-03-12 8 United Kingdom Unknown
## 1909 2046 2014-03-10 9 United Kingdom Unknown
## 1910 2047 2014-03-05 10 United Kingdom Unknown
## 1911 2049 2014-03-03 10 United Kingdom Unknown
## 1912 2052 2014-02-27 2 United Kingdom Unknown
## 1913 2053 2014-02-25 8 United Kingdom Unknown
## 1914 2054 2014-02-25 2 United Kingdom Unknown
## 1915 2055 2014-02-24 10 Spain Unknown
## 1916 2056 2014-02-21 8 Belgium Unknown
## 1917 2058 2014-02-19 1 Switzerland Unknown
## 1918 2060 2014-02-17 8 United Kingdom Unknown
## 1919 2061 2014-02-15 10 United Kingdom Unknown
## 1920 2062 2014-02-13 10 United Kingdom Unknown
## 1921 2063 2014-02-11 5 United Kingdom Unknown
## 1922 2064 2014-02-10 1 United Kingdom Unknown
## 1923 2065 2014-02-10 9 United Kingdom Unknown
## 1924 2066 2014-02-07 10 United Kingdom Unknown
## 1925 2068 2014-02-04 6 United Kingdom Unknown
## 1926 2069 2014-02-03 4 United Kingdom Unknown
## 1927 2070 2014-02-03 8 United Kingdom Unknown
## 1928 2071 2014-01-21 8 United Kingdom Unknown
## 1929 2072 2014-01-21 10 Ireland Unknown
## 1930 2073 2014-01-20 9 United Kingdom Unknown
## 1931 2074 2014-01-17 10 United Kingdom Unknown
## 1932 2076 2014-01-14 1 United Kingdom Unknown
## 1933 2077 2014-01-14 10 United Kingdom Unknown
## 1934 2078 2014-01-13 9 Cyprus Unknown
## 1935 2080 2014-01-08 1 United Kingdom Unknown
## 1936 2081 2014-01-08 8 Belgium Unknown
## 1937 2082 2014-01-03 7 United Kingdom Unknown
## 1938 2083 2013-12-30 9 United Kingdom Unknown
## 1939 2084 2013-12-29 10 United States Unknown
## 1940 2086 2013-12-25 10 United Kingdom Unknown
## 1941 2088 2013-12-25 4 United Kingdom Unknown
## 1942 2089 2013-12-23 9 United Kingdom Unknown
## 1943 2090 2013-12-23 6 Greece Unknown
## 1944 2091 2013-12-20 8 United Kingdom Unknown
## 1945 2094 2013-12-16 10 United Kingdom Unknown
## 1946 2095 2013-12-16 10 United Kingdom Unknown
## 1947 2096 2013-12-10 7 United Kingdom Unknown
## 1948 2097 2013-12-09 10 Spain Unknown
## 1949 2098 2013-12-09 2 United Kingdom Unknown
## 1950 2099 2013-12-09 10 United Kingdom Unknown
## 1951 2100 2013-12-04 10 United Kingdom Unknown
## 1952 2101 2013-12-04 10 Ireland Unknown
## 1953 2103 2013-12-02 10 United Kingdom Unknown
## 1954 2104 2013-11-29 10 United Kingdom Unknown
## 1955 2105 2013-11-29 2 United States Unknown
## 1956 2106 2013-11-28 1 United Kingdom Unknown
## 1957 2108 2013-11-27 1 United Kingdom Unknown
## 1958 2110 2013-11-27 8 United Kingdom Unknown
## 1959 2111 2013-11-25 10 United Kingdom Unknown
## 1960 2113 2013-11-21 9 United Kingdom Unknown
## 1961 2114 2013-11-19 7 Switzerland Unknown
## 1962 2115 2013-11-14 10 United Kingdom Unknown
## 1963 2116 2013-11-14 5 United Kingdom Unknown
## 1964 2117 2013-11-13 3 Norway Unknown
## 1965 2118 2013-11-13 10 Ireland Unknown
## 1966 2119 2013-11-10 9 Ireland Unknown
## 1967 2120 2013-11-06 5 United Kingdom Unknown
## 1968 2123 2013-11-06 1 United Kingdom Unknown
## 1969 2124 2013-11-04 9 United Kingdom Unknown
## 1970 2128 2013-10-29 10 United Kingdom Unknown
## 1971 2129 2013-10-29 10 United Kingdom Unknown
## 1972 2132 2013-10-29 2 United Kingdom Unknown
## 1973 2135 2013-10-23 8 Spain Unknown
## 1974 2136 2013-10-23 10 Ireland Unknown
## 1975 2137 2013-10-22 8 United Kingdom Unknown
## 1976 2138 2013-10-22 6 United Kingdom Unknown
## 1977 2140 2013-10-22 9 Germany Unknown
## 1978 2141 2013-10-20 4 Germany Unknown
## 1979 2142 2013-10-18 10 Ireland Unknown
## 1980 2143 2013-10-18 10 Ireland Unknown
## 1981 2145 2013-10-15 8 United Kingdom Unknown
## 1982 2146 2013-10-15 3 United Kingdom Unknown
## 1983 2147 2013-10-15 1 Malaysia Unknown
## 1984 2148 2013-10-15 10 United Kingdom Unknown
## 1985 2149 2013-10-15 10 Spain Unknown
## 1986 2151 2013-10-13 8 United Kingdom Unknown
## 1987 2152 2013-10-13 1 United Kingdom Unknown
## 1988 2153 2013-10-13 10 Ireland Unknown
## 1989 2154 2013-10-10 10 United Kingdom Unknown
## 1990 2155 2013-10-10 4 United Kingdom Unknown
## 1991 2157 2013-10-09 10 Ireland Unknown
## 1992 2158 2013-10-07 8 United Kingdom Unknown
## 1993 2159 2013-10-07 3 United Kingdom Unknown
## 1994 2161 2013-10-07 10 United Kingdom Unknown
## 1995 2163 2013-10-07 9 United Kingdom Unknown
## 1996 2165 2013-10-07 10 United Kingdom Unknown
## 1997 2166 2013-10-03 10 United Kingdom Unknown
## 1998 2168 2013-10-03 10 United Kingdom Unknown
## 1999 2170 2013-10-02 10 United Kingdom Unknown
## 2000 2171 2013-10-01 4 United Kingdom Unknown
## 2001 2172 2013-10-01 2 Australia Unknown
## 2002 2173 2013-10-01 10 United Kingdom Unknown
## 2003 2174 2013-10-01 2 Denmark Unknown
## 2004 2175 2013-10-01 9 United Kingdom Unknown
## 2005 2176 2013-10-01 3 Australia Unknown
## 2006 2177 2013-09-29 10 Portugal Unknown
## 2007 2178 2013-09-29 10 Italy Unknown
## 2008 2179 2013-09-29 1 United Kingdom Unknown
## 2009 2182 2013-09-25 10 United Kingdom Unknown
## 2010 2183 2013-09-24 10 United Kingdom Unknown
## 2011 2184 2013-09-24 5 United Kingdom Unknown
## 2012 2185 2013-09-22 1 Ireland Unknown
## 2013 2187 2013-09-22 3 United Kingdom Unknown
## 2014 2188 2013-09-22 8 France Unknown
## 2015 2189 2013-09-22 1 United Kingdom Unknown
## 2016 2190 2013-09-19 1 United Kingdom Unknown
## 2017 2192 2013-09-18 8 United Kingdom Unknown
## 2018 2193 2013-09-18 2 United Kingdom Unknown
## 2019 2194 2013-09-18 8 United Kingdom Unknown
## 2020 2195 2013-09-17 2 United Kingdom Unknown
## 2021 2197 2013-09-17 2 Cyprus Unknown
## 2022 2199 2013-09-15 1 United Kingdom Unknown
## 2023 2201 2013-09-15 1 Germany Unknown
## 2024 2202 2013-09-15 8 United Kingdom Unknown
## 2025 2203 2013-09-13 1 Australia Unknown
## 2026 2204 2013-09-12 1 United Kingdom Unknown
## 2027 2205 2013-09-12 3 United Kingdom Unknown
## 2028 2206 2013-09-12 8 United Kingdom Unknown
## 2029 2209 2013-09-10 9 United Kingdom Unknown
## 2030 2211 2013-09-10 3 United Kingdom Unknown
## 2031 2212 2013-09-09 8 France Unknown
## 2032 2213 2013-09-08 10 United Kingdom Unknown
## 2033 2215 2013-09-08 5 United Kingdom Unknown
## 2034 2216 2013-09-08 10 United Kingdom Unknown
## 2035 2217 2013-09-08 2 United Kingdom Unknown
## 2036 2218 2013-09-05 7 Italy Unknown
## 2037 2219 2013-09-04 1 United Kingdom Unknown
## 2038 2220 2013-09-04 10 United Kingdom Unknown
## 2039 2221 2013-09-02 5 United Kingdom Unknown
## 2040 2222 2013-09-02 10 United Kingdom Unknown
## 2041 2224 2013-09-02 1 United Kingdom Unknown
## 2042 2226 2013-09-01 10 United Kingdom Unknown
## 2043 2227 2013-08-29 8 United Kingdom Unknown
## 2044 2228 2013-08-28 1 United Kingdom Unknown
## 2045 2229 2012-09-06 1 United Kingdom Unknown
## 2046 2230 2012-09-06 2 United Kingdom Unknown
## 2047 2231 2012-09-06 8 United Kingdom Unknown
## 2048 2232 2012-09-05 10 United Kingdom Unknown
## 2049 2233 2012-09-03 2 United Kingdom Unknown
## 2050 2234 2012-09-03 8 United Kingdom Unknown
## 2051 2235 2012-09-03 8 Spain Unknown
## 2052 2236 2012-09-03 1 United Kingdom Unknown
## 2053 2237 2012-09-03 7 United Kingdom Unknown
## 2054 2238 2012-09-03 1 United Kingdom Unknown
## 2055 2239 2012-09-03 6 United Kingdom Unknown
## 2056 2240 2012-09-03 9 United Kingdom Unknown
## 2057 2241 2012-08-29 10 United Kingdom Unknown
## 2058 2242 2012-08-29 2 Australia Unknown
## 2059 2243 2012-08-29 1 United Kingdom Unknown
## 2060 2244 2012-08-28 2 United Kingdom Unknown
## 2061 2245 2012-08-28 1 United Kingdom Unknown
## 2062 2246 2012-08-28 1 United Kingdom Unknown
## 2063 2247 2012-08-28 1 Australia Unknown
## 2064 2248 2012-08-23 2 United Kingdom Unknown
## Comment.title
## 1 "bang on time and smooth flights"
## 2 "Another good affordable flight"
## 3 \342\200\234Really impressed!\342\200\235
## 4 \342\200\234a decent offering from Ryanair\342\200\235
## 5 \342\200\234cabin crew were welcoming and friendly\342\200\235
## 6 "close online checkin 3 hours before"
## 7 "they are really not better value"
## 8 "asked me to pay for the backpack"
## 9 "they made us pay a No show fee"
## 10 \342\200\234Crew extremely well presented\342\200\235
## 11 "pay if you don\342\200\231t check in online"
## 12 "eight of the 10 flights had delays"
## 13 "try to avoid it in the future"
## 14 "offers fares at great value"
## 15 "inside the freezing plane one more hour"
## 16 "Play the game and you'll be fine"
## 17 "flying with Ryanair is a tiring thing"
## 18 "They give flights at good prices"
## 19 "delayed for more than 8 hours"
## 20 \342\200\234some leniency should be given\342\200\235
## 21 "very unpleasant to deal with Ryanair"
## 22 "\302\243165.00 as a penalty to get boarding passes"
## 23 "pay a penalty fee for my identical bag"
## 24 \342\200\234this trip was pleasantly uneventful\342\200\235
## 25 "let me queue up for 7 hours"
## 26 "had no issues with Ryanair so far"
## 27 "seating is appalling"
## 28 "pay 55 Eur for each person for airport boarding"
## 29 "The experience was awful"
## 30 "this goes way beyond what is reasonable"
## 31 "Ryanair is the worst possible experience"
## 32 "They set more traps for you than ever"
## 33 "Horrible communication"
## 34 "Ryanair did the job"
## 35 "Ryanair changes their rules as they wish"
## 36 Ryanair customer review
## 37 "we had to pay an additional 46EUR"
## 38 "charged one of us 30\342\202\254 to check-in"
## 39 "charged extra for a small bag"
## 40 "they give such cheap tickets"
## 41 "Good value for money"
## 42 "sold the seats we paid for"
## 43 "paid $300 in extra bag fees"
## 44 "We will never use them again"
## 45 "not pay my money back for the canceled flight"
## 46 "pay another 55 euro to be checked in"
## 47 "Leg room isn\342\200\231t great"
## 48 "staff at the gate refused me boarding"
## 49 "inexcusably rude treatment"
## 50 "selling food and lotto tickets rather than concentrating on safety"
## 51 "\342\202\25455 per person just to check you in"
## 52 "they were all at least 1 hour late"
## 53 "charge you fees for anything they can"
## 54 "You get what you pay for"
## 55 "55.00 / passenger if they fail to check-in online"
## 56 "not recommended"
## 57 "Thank you to the Ryanair team"
## 58 "\342\202\254124 because I didn\342\200\231t check in online"
## 59 "they only accepted credit cards"
## 60 "as basic as cheap flying can get"
## 61 "Two on time flights"
## 62 "Ryanair cancelled our flight"
## 63 "flight and aircraft were excellent"
## 64 "I had to pay again to even check in"
## 65 "Nightmare Experience with Ryanair Crew"
## 66 "Worst experience ever!"
## 67 "gate information they gave to me was false"
## 68 "an extremely frustrating experience"
## 69 "35 euros for the small gift bag"
## 70 "punctual reliable service"
## 71 "insisting that we could only carry four bags"
## 72 "no frills as expected"
## 73 "sticks to what it is"
## 74 "average no frills Ryanair flight"
## 75 "showed no interest in helping me"
## 76 "Terrible service"
## 77 "was no reason to be rude"
## 78 "delayed by nearly two hours"
## 79 "15 euro fare, no complaints"
## 80 "Staff weren't interested"
## 81 "found that terribly stressful"
## 82 "I will never use this airline again"
## 83 "Worst airline ever"
## 84 "Line to bag drop was astronomically long"
## 85 "worst airline we have ever flown"
## 86 "staff was really unfriendly"
## 87 "Very smooth flight"
## 88 "Flight on time, clean cabin"
## 89 "efficient and straightforward"
## 90 "they offer value and efficiency"
## 91 "Overall quite satisfied"
## 92 "Never again with them"
## 93 "A pleasant experience"
## 94 "Incredible experience"
## 95 "Very bad experience"
## 96 "Friendly approach"
## 97 "Will never fly with Ryanair again"
## 98 "confusion on their bags policy"
## 99 "highlight was checkin in fine"
## 100 "quite a good airline for the price"
## 101 "pleasant flight for a decent fare"
## 102 "Our Tuesday wasted completely"
## 103 "this airline is awful"
## 104 "Disaster customer service"
## 105 "An absolute disaster"
## 106 "Extremely unpleasant experience"
## 107 "very good service with lots of smile"
## 108 "The worst experience"
## 109 "I have never had worse service"
## 110 "appalling treatment we received"
## 111 "the poorest customer service"
## 112 "a breath of fresh air"
## 113 "wouldn't let me check in online"
## 114 "money grabbing tactics"
## 115 "Very attentive and pleasant staff"
## 116 "helpful, attentive, calm and polite"
## 117 "Unprofessional cabin crew"
## 118 "very friendly and professional"
## 119 "18 hour 30 minute delay"
## 120 "The low price is impossible to beat"
## 121 "Crew onboard were professional"
## 122 "the worst customer service"
## 123 "Plane was quite busy"
## 124 "Customer service is useless"
## 125 "Both flights were average"
## 126 "Never received any compensation"
## 127 "My flight has been cancelled"
## 128 "Bad customer service"
## 129 "They delayed our flight 20 hours"
## 130 "Boarding in a slaughterhouse queue"
## 131 "see if they can sell tickets at an inflated price"
## 132 "didn\342\200\231t receive any money back"
## 133 "the crew were friendly"
## 134 "I'm sad that Ryanair didn't even try to understand situation"
## 135 "Non existent customer care"
## 136 "the worst customer relation"
## 137 "easy and stress free start to my holiday"
## 138 "Fundamentally you do get what you pay for"
## 139 "kindness and smile should still be free"
## 140 "A real nightmare"
## 141 "started boarding too early2
## 142 "worst I have ever traveled with"
## 143 "Ryanair cabin crew makes me worried as a passenger"
## 144 "completely shocked by this airline"
## 145 "Overall a decent flight"
## 146 "seats were very hard and uncomfortable"
## 147 "One of the worst airlines I have seen"
## 148 "inhumane attitude toward customers"
## 149 "The aircraft was filthy"
## 150 "A very pleasing experience"
## 151 "62.15 per person to have boarding pass issued"
## 152 "terrible company, never on time"
## 153 "want to charge whatever they can"
## 154 "Priority boarding remains a total mess"
## 155 "Worst experience of my life
## 156 "out of Malaga the staff were rude"
## 157 "all hidden costs and trouble"
## 158 "treatment of passengers is inhumane"
## 159 "flight was delayed by over 3 hours"
## 160 "Cheapest tickets on the market"
## 161 "Hidden fees everywhere"
## 162 "most horrific airline to fly with"
## 163 "Poor customer service."
## 164 "Awful from start to finish"
## 165 "Overall a decent experience"
## 166 "Overall very poor service"
## 167 "service provided on a rather short flight was a great credit to the company"
## 168 "hold me accountable for a mistake"
## 169 "a stressful experience flying Ryanair"
## 170 "It is a very unprofessional company"
## 171 "charged \302\24355 to print a boarding pass"
## 172 "their way of taking our money"
## 173 "never a good experience"
## 174 "cannot recline your seat"
## 175 "you have check in online"
## 176 "bag I checked in had been left in Helsinki"
## 177 "no refund was due"
## 178 "excellent service"
## 179 "$110 to print our two boarding passes"
## 180 "Actually a pleasant flight"
## 181 "worst I have ever ever experienced"
## 182 "Absolutely horrendous service"
## 183 "let down by the cabin crew"
## 184 "I feel very grateful to Ryanair"
## 185 "there was no remorse from the staff"
## 186 "the flight was pleasant and quick"
## 187 "responsible and pleasant"
## 188 "feels like fraudulent sale"
## 189 "thank you for letting me pay for a service I never received"
## 190 "Every single flight delayed"
## 191 "They refused to give me what I asked"
## 192 "a very disappointing experience"
## 193 "Rude and disrespectful staff"
## 194 "I was very happy to fly with you"
## 195 "My experience with Ryanair this February was appalling"
## 196 "Will never choose Ryanair again!"
## 197 "worst airline I have ever flown"
## 198 "very disappointed of the Ryanair staff at Genoa"
## 199 "my suitcase has not been found"
## 200 "had to pay $128 for check in at airport"
## 201 "helpful and efficient treatment"
## 202 "The aircraft was semi-clean"
## 203 "I would avoid flying with them"
## 204 "I will not fly with Ryanair anymore!"
## 205 "has to be the worst customer service"
## 206 "They destroyed our family vacation"
## 207 "Don\342\200\231t be fooled by the affordable prices"
## 208 "still waiting for a decision if they are going to refund the money"
## 209 "cannot fault Ryanair on these flights"
## 210 "treat its customers so appallingly"
## 211 "we don't accept your apologies"
## 212 "This airline is a total farce"
## 213 "Good luck if you book Ryanair"
## 214 "Worst customer service ever"
## 215 "So unprofessional"
## 216 "I have flown Ryanair many times and the rules are clear"
## 217 "this airline is not value for money at all"
## 218 "not trust the transport would arrive"
## 219 "look for other airlines next time"
## 220 "I cannot accept manipulation of rule"
## 221 "Horrible staff"
## 222 "a considerable attitude problem"
## 223 "Shocking, unacceptable and dangerous disregard for customer"
## 224 "flight was the worst experience"
## 225 "All Ryanair staff we dealt with were polite and helpful"
## 226 "absolutely horrendous"
## 227 "the onboard crew were fine"
## 228 "customer service is a foreign idea to them"
## 229 "bad experience in Thessaloniki Airport"
## 230 "There are much better budget options"
## 231 "they made our experience so stressful"
## 232 "almost two weeks and it still not refunded"
## 233 "Terrible customer service"
## 234 "I chose not to fly"
## 235 "Plane is very dirty"
## 236 "The last time I am ever going to fly with them"
## 237 "last time I fly with them"
## 238 "ended up missing the 20 minute deadline"
## 239 "Well done Ryanair customer service"
## 240 "The ultimate in no frills"
## 241 "We will never fly Ryanair again"
## 242 "cabin crew friendly enough"
## 243 "So many hidden fees"
## 244 "Ryanair puts profits above people"
## 245 "Beware of the 3rd party services"
## 246 "This airline is worse than any cheap airline in the US"
## 247 "won't fly Ryanair again"
## 248 "most enjoyable flight"
## 249 "I am a very satisfied customer"
## 250 "Departure delayed for 45 minutes"
## 251 "wouldn\342\200\231t try to help us with the refund"
## 252 "end up paying more than just buying new flights"
## 253 "refused to exchange my flight"
## 254 "pay attention to your luggage"
## 255 "no patience, no kindness, no respect"
## 256 "terrible customer service"
## 257 "she was sure we needed a PCR test"
## 258 "cabin crew were excellent"
## 259 "Abysmal experience!"
## 260 "Don\342\200\231t let their stated prices misguide you"
## 261 "the flight was definitely worth the price"
## 262 "pleasant and efficient cabin crew"
## 263 "just a way to rob common people"
## 264 "I was not aware the gate closed"
## 265 "I will never take a Ryanair flight anymore"
## 266 "In a covid world the cabin was disgusting"
## 267 "Extremely unsatisfied with the lack of help"
## 268 "Still refused boarding"
## 269 "against company policy"
## 270 "Toilet was dirty and unhygienic"
## 271 "Zero customer service"
## 272 "good value Ryanair trip"
## 273 "Ryanair does not have any respect for the customers"
## 274 "The worst airline in the UK"
## 275 "just dismissed us from their minds"
## 276 "bags slightly bigger than the requirements"
## 277 "It was smooth and neat!"
## 278 "not customer oriented"
## 279 "proffer two thumbs up"
## 280 "Do not book car parking with this company"
## 281 "The most horrible airline I have ever flown in my life"
## 282 "shockingly incompetent organisation/administration"
## 283 "Very bad experience!"
## 284 "made me pay for it \342\202\25450"
## 285 "They advertised the food and drinks"
## 286 "Just the worst"
## 287 "no way I can actually reach Ryanair"
## 288 "truly horrible experience"
## 289 "Ryanair should be shut down"
## 290 "I cannot believe how rude and how the staff don\342\200\231t care"
## 291 "have never seen such disgusting behaviour"
## 292 "the crew were great"
## 293 "precautions against covid-19 are almost non-existent"
## 294 "Shame on you Ryanair!"
## 295 "bad customer service"
## 296 "150 euro of one ticket thrown away"
## 297 "I only paid \342\202\2545 for this flight"
## 298 "definitely fly Ryanair again"
## 299 "Flight cancelled because of ongoing changes to travel restrictions"
## 300 "we didn\342\200\231t check in online"
## 301 "clean plane and covid-19 conscious staff and passengers"
## 302 "What an absolute load of rubbish"
## 303 "I will forever be grateful"
## 304 "delayed refund for more than 2 months"
## 305 "manners not in the vocabulary"
## 306 "I didn't take this insulting offer"
## 307 "I am still waiting for a refund"
## 308 "I have never flown with them"
## 309 "they just cancel whatever flight they want to"
## 310 "Treating your loyal customers like this is a sure fire way to going bust"
## 311 "almost every row was not fully occupied"
## 312 "I now have to contact my credit card company"
## 313 "This is misleading"
## 314 "Another great flight"
## 315 "It was extremely comfortable"
## 316 "why do Ryanair people keep scamming people like thi"
## 317 "train people to better interact with passengers"
## 318 "extra fee for the checking-in"
## 319 "Jet2 has my business in future"
## 320 "I was charged the rebooking fee"
## 321 "cabin crew were fantastic"
## 322 "Have never experienced such bad customer service"
## 323 "This is fraud!"
## 324 "Blatantly deceiving their customers"
## 325 "airline is an absolute disgrace"
## 326 "Their arrogance is stunning"
## 327 "still haven't received a refund"
## 328 "you just lost a customer"
## 329 "friendly and professional"
## 330 "disrespect for the client"
## 331 "I forgot to fill it in"
## 332 "had to pay 55 EUR in the airport"
## 333 "customer service is shocking"
## 334 "appalling customer service"
## 335 "sent a voucher three months later"
## 336 "friendly and attentive cabin crew"
## 337 "Flight was 100% satisfactory"
## 338 "I just find all this very frustrating"
## 339 "Impressive cabin crew"
## 340 "They are just ripping people blind"
## 341 "I asked for a full refund"
## 342 "stay away from this airline!"
## 343 "In other words no refund"
## 344 "try to give me a voucher"
## 345 "the worst customer support "
## 346 "doesn't accept my claim"
## 347 "cheapskate, thieving company"
## 348 "the worst customer service"
## 349 "equivalent to pickpockets"
## 350 "allowed me to fly at low prices"
## 351 "outright liars trading fraudulently"
## 352 "not qualify for compensation"
## 353 "A huge thank you to Ryanair"
## 354 "praise them for an efficient system"
## 355 "do not really want to help you"
## 356 "Nice cabin crew"
## 357 "This is a rip off"
## 358 "Awful customer service"
## 359 "reference number was not recognised"
## 360 "very pleased with my experience"
## 361 "gate was closed 18/20 minutes before "
## 362 "charge you for everything"
## 363 "bag wheels was not fitting in"
## 364 "the entire experience was disgraceful"
## 365 "penny pinching by Ryanair"
## 366 "Couldn\342\200\231t be more happy!"
## 367 "carry on and pay 25\342\202\254 for it"
## 368 "Money making company"
## 369 "not care about its customers"
## 370 "Everything went smoothly"
## 371 "do not make even a single mistake"
## 372 "flight went definitely very well"
## 373 "Very good flight with Ryanair"
## 374 "Would never use them again"
## 375 "charge you for a boarding pass"
## 376 "couldn't sleep for more than 10 minutes"
## 377 "Charged \302\243110 just to check-in"
## 378 "Boarding took very long"
## 379 "Amazing service"
## 380 "went above and beyond"
## 381 "great flight in general"
## 382 "Difficult job performed well"
## 383 "had to pay 50 euros for check in"
## 384 "service on board cannot be criticized"
## 385 "Holiday ruined again"
## 386 "Absolutely no customer care"
## 387 "save yourself the anxiety and travel with someone else"
## 388 "Nothing really to grumble about"
## 389 "not accepted to refund my tickets"
## 390 "Highly recommended!"
## 391 "Baggage policy unclear"
## 392 "Absolutely absurd"
## 393 "expensive with all the hidden extras"
## 394 "object to paying the extortionate charges for luggage"
## 395 "I was denied boarding"
## 396 "nothing was too much trouble"
## 397 "to praise the airline"
## 398 "Worst experience ever"
## 399 "charge for everything"
## 400 "not have time to leave it at check in"
## 401 "not checked in online"
## 402 "lack of customer care"
## 403 "Staff were nice and friendly"
## 404 "very upset with Ryanair"
## 405 "The cheap becomes expensive"
## 406 "no reminder email, no heads-up"
## 407 "the lowest low cost"
## 408 "Poorest ever customer service"
## 409 "I couldn't check-in online"
## 410 "by far the worst airline I know"
## 411 "we never flew"
## 412 "Refused to to get us on board"
## 413 "won't be flying Ryanair again"
## 414 "Delay not communicated clearly"
## 415 "Won\342\200\231t book again"
## 416 Ryanair customer review
## 417 "incompetent staff"
## 418 "had to pay extra for cabin bags"
## 419 "They will sit you apart"
## 420 "We arrived late to the Gate"
## 421 "55\342\202\254 to print boarding pass"
## 422 "55 GBP for check in at the airport"
## 423 "hand luggage too big"
## 424 "had to pay \302\24355 to check in"
## 425 "Terrible customer service"
## 426 "we had a decent flight with Ryanair"
## 427 "Satisfied with the airline"
## 428 "Very good experience"
## 429 "had the worst experience"
## 430 "offered me \302\24325 refund"
## 431 "pay a 55 euro fee per person"
## 432 "they wouldn\342\200\231t let me board"
## 433 "66\342\202\254 for Check in at the airport"
## 434 "did not have a good experience"
## 435 "worst airline I have ever flown"
## 436 "seat was wider than expected"
## 437 "have never had any problems"
## 438 "55 euro to check in at the airport"
## 439 "\302\24324 to sit together"
## 440 "charged for check in 55\342\202\254"
## 441 "a money scamming airline"
## 442 "an absolute rip off"
## 443 "Shame on you Ryanair"
## 444 "have to pay one more time"
## 445 "an absolute disaster"
## 446 "Hideous customer service"
## 447 "changed the flight time"
## 448 "First, Last, Only. Beware"
## 449 "Worst customer service"
## 450 "not a low cost company"
## 451 "you get what you pay for"
## 452 "\302\24314 per flight for priority boarding"
## 453 "impressed with everything"
## 454 "I felt so stupid"
## 455 "paying 25\342\202\254 on a luggage"
## 456 "I didn't check in online"
## 457 "55 euros each to be able to check in"
## 458 "pilot kept us in the updated"
## 459 "\302\24355 for not checking in online"
## 460 "staff is very unfriendly"
## 461 "We didn't do online check in"
## 462 "55 Euro fee each for checking in"
## 463 "How very embarrassing"
## 464 "my suitcase was 2kgs too heavy"
## 465 "made to pay \342\202\25425 as my bag"
## 466 "I forgot to check-in"
## 467 "legroom on this flight wasn't bad"
## 468 "refused to fly due to pregnancy"
## 469 "been delayed 6 hours"
## 470 "Very poor refund policy"
## 471 "Total extortion"
## 472 "I have never had any problems"
## 473 "6 mins late for check in"
## 474 "overcharged to check saxophone"
## 475 "You pay for everything"
## 476 "was the worst experience"
## 477 "two trouble free flights"
## 478 "online check-in was required"
## 479 "Customer Service are robots"
## 480 "Staff were extremely rude"
## 481 "A really useless airline"
## 482 "pay 60 euro for a piece of paper"
## 483 "This airline is a disgrace"
## 484 "splitting up young families"
## 485 "I'll never use this horrible airline again"
## 486 "A big disappointment"
## 487 "complete lack of customer service"
## 488 "what a rip off"
## 489 "seat is everything but comfortable"
## 490 "pay extra for everything"
## 491 "Be careful with them"
## 492 "What a rip off"
## 493 "7 of us missed the flight"
## 494 "Worst airport experience"
## 495 "luggage policy is unbelievable"
## 496 "The worst airline ever"
## 497 "I've had to buy a new ticket"
## 498 "disappointed with this company"
## 499 "wallet disappeared into thin air"
## 500 "denying to let us board "
## 501 "Not great service"
## 502 "staff were very unhelpful"
## 503 "I felt it was misleading"
## 504 "First and last time with this lousy company"
## 505 "could not fly because she need her passport"
## 506 "This is an absolute rip off"
## 507 "frustrating check in process"
## 508 "Great service, friendly staff"
## 509 "decided to not do online check-in"
## 510 "rude employees at the airport"
## 511 "cunning part of Ryanair"
## 512 "Cost 5/10 Service 0/10"
## 513 "plane was late"
## 514 "Typical low cost carrier"
## 515 "a straightforward and simple service"
## 516 "overpriced food and uncomfortable seats"
## 517 "Good customer service"
## 518 "cannot find any positive aspect"
## 519 "Nobody was there to take control"
## 520 "really poor customer service"
## 521 "impossible to get hold of customer service"
## 522 "no issues what so ever"
## 523 "not allowed on the flight"
## 524 "My holiday was ruined by this company"
## 525 "the worst experience"
## 526 "An excellent flight"
## 527 "very unhelpful, very rude"
## 528 "had to pay to change my husbands seat"
## 529 "should have read terms and conditions"
## 530 "unprofessional for time keeping"
## 531 "Will never fly with them again"
## 532 "horrible customer service"
## 533 "\302\24355 to print a boarding pass"
## 534 "never again after this fiasco"
## 535 "Quiet flight and on time"
## 536 "55 euros for a boarding pass"
## 537 "charged me to check-in at airport"
## 538 "No customer service at all"
## 539 "charge if you don\342\200\231t get boarding pass"
## 540 "delayed every time without fail"
## 541 "An unpleasant experience"
## 542 "Cabin crew were useless"
## 543 "the quality of service gets worse and worse"
## 544 "rubbish check-in policy"
## 545 "fee to just get a boarding pass"
## 546 "inconsistent customer service"
## 547 "pay a little bit extra"
## 548 "What a money grab"
## 549 "Terrible as always"
## 550 "Changed my flight"
## 551 "pay an extra \302\24350 for my case"
## 552 "told we had to pay for the boarding pass"
## 553 "a disaster airline company"
## 554 "shambles of a service"
## 555 "print boarding pass ahead of time"
## 556 "this was the most bizarre experience"
## 557 "airline did a great job"
## 558 "Missed our flight"
## 559 "\342\202\254110 for not checking in online"
## 560 "it adds up in extras"
## 561 "advised we had to check in online"
## 562 "abysmal check-in process"
## 563 "I will never use them again"
## 564 "credit where credits due"
## 565 "average flight on Ryanair"
## 566 "Awful experience at the airport"
## 567 "ends up costing more"
## 568 "not recommend this airline"
## 569 "atrocious, extortionate budget airline"
## 570 "no sign of priority boarding"
## 571 "learn some customer service and respect"
## 572 "Terrible customer service"
## 573 "has no interest in it's customers"
## 574 "flights both way were very unpleasant"
## 575 "I am very disappointed"
## 576 "the worst airline ever"
## 577 "No value for money"
## 578 "avoid this airline"
## 579 "20\342\202\254 to print off boarding passes"
## 580 "provided excellent service"
## 581 "Very poor service"
## 582 "started to argue with me"
## 583 "have nothing but praise for Ryanair"
## 584 "A pleasant surprise"
## 585 "had to pay for not checking in"
## 586 "Staff are invariably pleasant"
## 587 "pay \342\202\25455 each to check in"
## 588 "face a 3 hour delay"
## 589 "I had to buy another ticket"
## 590 "flights there and back were fine"
## 591 "staff are nicer than some airlines"
## 592 "all went smoothly"
## 593 "Worst airline I've ever flown"
## 594 "extra 25\302\243 for having a hand luggage"
## 595 "flight back was safe, uneventful"
## 596 "last Ryanair flight I'll ever take"
## 597 "had a terrible experience"
## 598 "avoid if possible"
## 599 "Avoid like the plague"
## 600 "extra $95 for not checking in"
## 601 "reminded me of fawlty towers"
## 602 "getting much more expensive"
## 603 "totally disinterested staff"
## 604 "unprofessional and disrespectful"
## 605 "seats were not together"
## 606 "Terrible service"
## 607 "never experienced this type of rip off"
## 608 "always get what I pay for"
## 609 "Efficient and fast boarding"
## 610 "Their size bag is smaller"
## 611 "Terrible service from Ryanair"
## 612 "Read itinerary and small print"
## 613 "Zero customer service interest"
## 614 "Biggest way of conning people"
## 615 "so disappointed with the staff"
## 616 "they are cheap but nasty"
## 617 "Staff were very rude and not helpful at all"
## 618 "ended up delayed to 5.15 pm"
## 619 "try to fly with carry on"
## 620 "told that we were late"
## 621 "worst airline I\342\200\231ve ever flown"
## 622 "would use again"
## 623 "will never fly this airline again"
## 624 "it was value for money"
## 625 "not the way to run check in"
## 626 "required to check in at airport"
## 627 "an awful experience"
## 628 "never to fly with Ryanair again"
## 629 "flight was delayed by 60 minutes"
## 630 "Another good experience with Ryanair"
## 631 "I was very satisfied"
## 632 "it was standard Ryanair service"
## 633 "pleasure flying with you"
## 634 "55 euros give boarding pass"
## 635 "charged extra to check in"
## 636 "refused to allow me to board"
## 637 "no consistency in the product"
## 638 "not recommend this airline"
## 639 "If possible avoid this airline"
## 640 "not entitled to compensation"
## 641 "second good experience"
## 642 "we were not allowed to queue"
## 643 "pay $50 for the bag"
## 644 "tell me I had to check in online"
## 645 "extra 20\342\202\254 for carry on bag"
## 646 "Overall, terrible experience"
## 647 "Such disrespect for customers"
## 648 "worst carrier I\342\200\231ve flown"
## 649 "horrible as always"
## 650 "expect the personnel to be nice"
## 651 "They still charged me"
## 652 "a good experience"
## 653 "charged extra \302\24320 for my bag"
## 654 "would fly them without hesitation"
## 655 "everything with my flight went fine"
## 656 "a very bad experience."
## 657 "charge to print your boarding pass"
## 658 "do the job without fuss "
## 659 "not customer friendly actions"
## 660 "a comfortable flight"
## 661 "Never again on Ryanair"
## 662 "the worst experience"
## 663 "pay for cabin luggage"
## 664 "made me pay \302\24320 for cabin luggage"
## 665 "the prices changed"
## 666 "Departure was a nightmare"
## 667 "I regret flying them"
## 668 "This airline has got to be the worst"
## 669 "no-fuss service"\n
## 670 "its just not a nice experience"
## 671 "made me pay an extra 20\302\243"
## 672 "4 hours of torture"
## 673 "most awful experience"
## 674 "Don\342\200\231t fly Ryanair"
## 675 "I was very impressed"
## 676 "drunk lady on the flight"
## 677 "pricing ending with a rip off"
## 678 "fraudulent and absolutely unacceptable"
## 679 "I have never had this happen to me"
## 680 "bye bye Ryanair"
## 681 "found a flight with easyJet"
## 682 "won't be flying Ryanair anymore"
## 683 "announcements only in Italian"
## 684 "It's their loss"
## 685 "disappointed in Ryanair service"
## 686 "charged 100\342\202\254 for the same bags"
## 687 "regretted it from the off"
## 688 "never fly Ryanair again"
## 689 "Ryanair you are absolutely abysmal"
## 690 Ryanair customer review
## 691 "I found the staff very friendly"
## 692 "the plane was dirty"
## 693 "is an absolute nightmare"
## 694 "Terrible experience today"
## 695 "biggest scam airlines"
## 696 "Read the fine print"
## 697 "24 EUR for two pieces of 10kg luggage"
## 698 "extra for picking your seats"
## 699 "very smooth flight"
## 700 "never use them again"
## 701 "Thank you for flexibility"
## 702 "hidden fees everywhere"
## 703 "left customer stranded"
## 704 "incompetent and rude"
## 705 "I was very disappointed"
## 706 "pay again for the bags"
## 707 "What a terrible airline"
## 708 "a great surprise"
## 709 "such an uncomfortable experience"
## 710 "\342\202\25455 to check in"
## 711 "crew on board friendly"
## 712 "efficient with no frills"
## 713 "55\342\202\254 airport check in fee"
## 714 "Never again Ryanair"
## 715 "I'll never fly them again"
## 716 "would not recommend Ryanair"
## 717 "definitely no more Ryanair"
## 718 "cabin crew were friendly"
## 719 "follow booking instructions"
## 720 "Bad support staff"
## 721 "a great experience"
## 722 "do it with easyJet, not Ryanair"
## 723 "Everything went very well"
## 724 "not fly with Ryanair again"
## 725 "ended up with extra costs"
## 726 "Totally disappointing experience"
## 727 "pushchair is destroyed"
## 728 " itinerary was changed 3 times"
## 729 "courteous and very professional"
## 730 "Found the service to be horrendous"
## 731 "good flight, good service"
## 732 "Price is very cheap"
## 733 "Very easy and no hassle"
## 734 "had to pay extra for a seat"
## 735 "are sort of reliable"
## 736 "I am really disappointed"
## 737 "cabin crew was really nice"
## 738 " Would fly again"
## 739 "Terrible experience"
## 740 "Ryanair really couldn't help"
## 741 Ryanair customer review
## 742 "delayed about 7 hours"
## 743 "there was a 2h 30min delay"
## 744 "a horrible experience"
## 745 "Horrible service and hidden fees"
## 746 "another \302\24340 at the gate"
## 747 "Great, easy, quick flight"
## 748 "worst customer service"
## 749 "Good experience"
## 750 "Overall a good experience"
## 751 "worst customer service"
## 752 "Ryanair is the worst airline"
## 753 "most unhelpful people"
## 754 "Brilliant airline"
## 755 "1st it was a hidden fee"
## 756 "check in online to avoid the fee"
## 757 "totally disorganised"
## 758 "disappointing more and more"
## 759 "wasn't aware that it was mandatory"
## 760 "confusing baggage allowance"
## 761 "never fly with Ryanair again"
## 762 "nobody was able to help me"
## 763 "We missed the flight"
## 764 "made us pay about 100 GBP more"
## 765 "constantly changing rules"
## 766 "Constantly changing rules"
## 767 "priority boarding was 100 people"
## 768 "the worst company ever"
## 769 "A cheap company"
## 770 "Very bad experience"
## 771 "getting worse and worse"
## 772 "policy is meaningless"
## 773 "split people that travel together"
## 774 "wait outside for half an hour"
## 775 "answered me rudely"
## 776 "not book any special services"
## 777 "We had to cancel our flight"
## 778 "I couldn't have asked for more"
## 779 "straight forward rip off"
## 780 "latest profiteering strategies"
## 781 "rather nice flight"
## 782 "$60 for a check-in charge"
## 783 "rules on baggage policy"
## 784 "no announcement were made"
## 785 "no responsibility at all"
## 786 "most uncomfortable flight"
## 787 "pay a late check-in fee"
## 788 "never choose Ryanair again"
## 789 "worst check in experience"
## 790 "Lovely staff on both legs"
## 791 "never fly Ryanair again"
## 792 "Never again with Ryanair"
## 793 "nobody does anything"
## 794 "friendly helpful crew"
## 795 "Shameful money grabbing"
## 796 "a very relaxed journey"
## 797 "not friendly nor proactive"
## 798 "a great airline"
## 799 "worst airline to fly"
## 800 "is a great airline"
## 801 "crew friendly and courteous"
## 802 "worst airline I have flown with"
## 803 "Never flying Ryanair again"
## 804 "pay to get a boarding pass"
## 805 "charged me to check in at airport"
## 806 "et null service either in airport"
## 807 "discriminatory baggage policy"
## 808 "delayed sat on the plane for 2.55h"
## 809 "55 euros if you check in at the airport"
## 810 "extra fee for check in"
## 811 "I tried to check in online"
## 812 "old baggage rules applied"
## 813 "Staff friendly and smiling"
## 814 "particularly nice and attentive"
## 815 "horrendous customer service"
## 816 "an overall okay experience"
## 817 Ryanair customer review
## 818 "Never fly them"
## 819 "was pleasantly surprised"
## 820 "Just don't do it"
## 821 "too much to have seats together"
## 822 "horrible and expensive"
## 823 "Ryanair has lost it's appeal"
## 824 "Complete waste of money"
## 825 "avoid flying Ryanair in future"
## 826 "charged to print boarding pass"
## 827 "pay to sit next to each other"
## 828 "I\342\200\231m not impressed"
## 829 "asked to pay 50 Euros"
## 830 "Very efficient flight"
## 831 "Cabin uncomfortably hot then cold"
## 832 "my last trip with Ryanair"
## 833 "Terrible service"
## 834 "charged me \342\202\25455 to check in"
## 835 "shameful, stressful flight"
## 836 "not fly Ryanair again"
## 837 "flight was cancelled"
## 838 "Really nice airline"
## 839 "lack of politeness"
## 840 "Flight itself chaotic"
## 841 "Worst airline I have been on"
## 842 "fast, cheap and great"
## 843 "you have enough legroom"
## 844 "flight was excellent"
## 845 "Staff on board pleasant"
## 846 "experience the worst ever"
## 847 "gone downhill again"
## 848 "the flight is cancelled"
## 849 "avoid Ryanair at all costs"
## 850 "my flight was on time"
## 851 "refuses to compensate us"
## 852 "quick and comfortable flight"
## 853 "an absolute nightmare"
## 854 "I've not had a single issue"
## 855 "delayed by 5.5 hours so far"
## 856 "they haven't refunded us"
## 857 "waiting five months for a refund"
## 858 "cancelled 2 hours before"
## 859 "not be using Ryanair again"
## 860 "never with Ryanair"
## 861 "delay of almost 1 hour"
## 862 "last 2 were a nightmare"
## 863 "the worst airline"
## 864 "Never ever again"
## 865 "useless customer service"
## 866 "delays left right and centre"
## 867 "value for money flight"
## 868 "never fly them again"
## 869 "flight was cancelled"
## 870 "eventually all good"
## 871 "they made us pay extra"
## 872 "Worst experience"
## 873 "Never take Ryanair"
## 874 "Horrible experience"
## 875 "55 euros to check in"
## 876 "More than 3 hours delay"
## 877 "no information available"
## 878 "truly dreadful experience"
## 879 "fee to check in"
## 880 "never a good experience"
## 881 "What a shambles!"
## 882 "Absolute shambles"
## 883 "Absolute nightmare"
## 884 "Unacceptable service"
## 885 "very disappointing experience"
## 886 "worth avoiding this company"
## 887 "Ryanair goes down every year"
## 888 "As usual delayed"
## 889 "could not care one bit"
## 890 "always been happy with them"
## 891 "told we had to check-in online
## 892 "Terrible experience"
## 893 "never fly with them again"
## 894 "worst customer care"
## 895 "an absolute disappointment"\n
## 896 "every flight is always late"\n
## 897 "cancelled without information"
## 898 "completely unhelpful attitude"
## 899 "Avoid at all costs"
## 900 "worst flying experience ever"
## 901 "Our flight got cancelled"
## 902 "delayed by almost 3 hours"
## 903 "never recommend this airline"
## 904 "live chat does not actually exist!"
## 905 "greyhound bus in the sky"
## 906 "Every possible hassle"
## 907 "My last Ryanair flight"
## 908 "happy with the inflight experience"
## 909 "Legroom was fine"
## 910 "plane was delayed once again"
## 911 "group of drunk guys on board"
## 912 "apparently no options available"
## 913 "Abysmal customer service"
## 914 "pay for so many extras"
## 915 "not very good for me"
## 916 "All goes wrong"
## 917 "skirt just around the EU laws"
## 918 "my last flight with Ryanair"
## 919 "boarding process was efficient"
## 920 "big 0 for customer service"
## 921 " a budget airline"
## 922 "try to do the check in online"
## 923 "will try to avoid this airline"
## 924 "a terrible experience"
## 925 "delayed by an hour"
## 926 "most unhelpful customer service"
## 927 "delayed by 7+ hours"
## 928 "would not recommend"
## 929 "price can't be beaten"
## 930 "would never recommend"
## 931 "most unhelpful company"
## 932 "riding on a Greyhound Bus"
## 933 "delayed an hour"
## 934 "pay extra to travel together"
## 935 "will never fly Ryanair again"
## 936 "flight over an hour late"
## 937 "flight got cancelled"
## 938 "\302\24355 each to print a boarding pass"
## 939 "miserable experience all around"
## 940 "save yourself from this nightmare"
## 941 "bag policy is just a joke"
## 942 "Ryanair, never again"
## 943 "appalling punctuality"
## 944 "Late Late Late"
## 945 "did not do an online check in"
## 946 "often late at the moment"
## 947 "a real bad flight"
## 948 "problem with Ryanair car rental"
## 949 "Very good value for money"
## 950 "plane was very clean as always"
## 951 "this flight was excellent"
## 952 "worst of the budget airlines"
## 953 "Horrible, unbearable"
## 954 "payment had not gone through"
## 955 "refuse to reimburse you"
## 956 "staff very pleasant"
## 957 "service overall was great"
## 958 "a disappointing service"
## 959 "happy Ryanair customer"
## 960 "one of the best flights"
## 961 "no customer care"
## 962 "it was a good experience"
## 963 "Overall, worth what we paid"
## 964 "charged for not checking in"
## 965 "bad overbooking experience"
## 966 "we sat for 2 hours"
## 967 "friendly, kind and helpful"
## 968 "Kafkaesque and dispiriting"
## 969 "Shame on you Ryanair"
## 970 "asked for some kind of compensation"
## 971 "very pleased with the price"
## 972 "charged 55 euro for boarding pass"
## 973 "have not received refund"
## 974 "deserve better treatment"
## 975 "Flights were punctual"
## 976 "never book with them again"\n
## 977 "taking my business elsewhere"
## 978 "No one was keeping us informed"
## 979 "customer services very prompt"
## 980 "trying to rip you off"
## 981 "Customer service is rude"
## 982 "don't really understand new baggage policy"
## 983 "charged me for not doing online check in"
## 984 "No customer service quality"
## 985 "staff were very nice and courteous"
## 986 "avoiding compensation claims"
## 987 "they would not let us through"
## 988 "Very poor and unprofessional service"
## 989 "staff members who didn't care"
## 990 "Very courteous and polite"
## 991 "customer service was absolutely disgraceful"
## 992 "will use again for short routes"
## 993 "splitting passengers travelling together"
## 994 "Cabin crew very friendly"
## 995 "a pathetic money grabbing system"
## 996 "The low cost has risks"
## 997 "nothing but praise for Ryanair"\n
## 998 "lack of consideration for passengers"
## 999 "the cabin crew was fantastic"
## 1000 "The joy of flying is absent when using Ryanair"
## 1001 "service standard is basic"
## 1002 "we had to pay 55 euros per person"
## 1003 "getting worse by the day"
## 1004 "I will avoid flying Ryanair"
## 1005 "Airplane was new and clean"
## 1006 "decent flight for a budget airline"
## 1007 "excessive size of our trolley"
## 1008 "we were treated with great disrespect"
## 1009 "was one of the better flights"
## 1010 "Never trust Ryanair for anything"
## 1011 "experience has been frustrating"
## 1012 "will never fly with Ryanair again"
## 1013 "Smooth, no nonsense flight"
## 1014 "unbelievably rude and hostile"
## 1015 "as good as can be expected"
## 1016 Ryanair customer review
## 1017 "disappointed about all the supplements"
## 1018 Ryanair customer review
## 1019 "seat is fair in terms of the space"
## 1020 "communicating with Ryanair not easy"
## 1021 "allocated different seats"
## 1022 "make a complaint on the website"
## 1023 "worst experience I\342\200\231ve had with Ryanair"
## 1024 "Very very disappointed."
## 1025 "I forgot to check in online"
## 1026 "arrives 90% on time"
## 1027 "This isn\342\200\231t worth the hassle"
## 1028 "Another money making con"
## 1029 "Very nice and enjoyable flight"
## 1030 "all of us scattered around the plane"
## 1031 "Worst airline flown with"
## 1032 "the day started with a delay"
## 1033 "bewildered and shocked"
## 1034 "obnoxious pricing schemes"
## 1035 "all started changing seats"
## 1036 "really good value for money"
## 1037 "spent almost 8 hours in the plane"
## 1038 "positively surprised"
## 1039 "any worse company than Ryanair"
## 1040 "not happy or impressed"
## 1041 "offered no help or assistance"
## 1042 "There were many hidden costs"
## 1043 "flight crew were not very helpful"\n
## 1044 "You get what you pay for"
## 1045 "were assigned random seats"
## 1046 "most opportunist of all airlines"
## 1047 "Terrible service all around"
## 1048 "didn't let us fly"
## 1049 "this is by far the worst"
## 1050 "I will never fly with them again"
## 1051 "never had a worse travelling experience"
## 1052 "make its flight miserable"
## 1053 "worst airline customer service"
## 1054 "Best flight so far this year"
## 1055 "terrible customer service"
## 1056 "exploited as much as possible"
## 1057 "will always try to avoid"
## 1058 "we were seated separately"\n
## 1059 "I was prepared"
## 1060 "Very efficient"
## 1061 "Disorganised, poor customer service"
## 1062 "they aren't worth it"
## 1063 "tagged my hand luggage bag"
## 1064 "flight crew were all charming"
## 1065 "both journeys arrived on time"
## 1066 "the underlying greedy vibe"
## 1067 "last time flying Ryanair"
## 1068 "Completely shocking behaviour"
## 1069 "11 hours waiting on a delay"
## 1070 "forcing me to check in my bag"
## 1071 "getting worse and worse"
## 1072 "Ryanair behaved so unprofessionally"
## 1073 "Ryanair have really let me down"
## 1074 "obviously don't care"
## 1075 "Great value for money"
## 1076 "Ryanair service is bad"
## 1077 "treat customers like livestock"
## 1078 "nothing good to say"
## 1079 "dumped at the airport"
## 1080 "best to avoid Ryanair"
## 1081 "had a pleasant flight back"
## 1082 "pick Ryanair over degraded BA"
## 1083 Ryanair customer review
## 1084 "They are tight with baggage"
## 1085 "shocking and disappointing"
## 1086 "will not be flying with Ryanair again"
## 1087 "staff show no professionalism"
## 1088 "not be using Ryanair transfer services"
## 1089 "horrifically awful"
## 1090 "prices have lost transparency"
## 1091 "in two seats nowhere near each other"
## 1092 "things are very unorganised"
## 1093 "handled the cancellation efficiently"
## 1094 "was not a cheap flight"
## 1095 "my least favourite airline"
## 1096 "will give separated seats"
## 1097 "on time, little leg space"
## 1098 "delays on both legs of our journey"
## 1099 "won't be flying with Ryanair again"
## 1100 "I was shocked at the filth"
## 1101 "avoid this airline from now on"
## 1102 "overall very good"
## 1103 "you get what you pay for"
## 1104 "just want more money from you"
## 1105 "the only issue was boarding"
## 1106 "no hesitation in using them again"
## 1107 "never again with Ryanair"
## 1108 "Ridiculous ticket policy"
## 1109 "last time we fly with Ryanair"
## 1110 "Spend the extra money and fly elsewhere"
## 1111 "Shocking customer service"
## 1112 "would definitely recommend "
## 1113 "should improve some parts"
## 1114 "improved in the last few years"
## 1115 "Plane was very old and uncomfortable"
## 1116 "Crew attentive as always"
## 1117 "overall positive experience"\n
## 1118 "Definitely use them again"
## 1119 "The plane was very hot"
## 1120 "comfortable and good leg room"
## 1121 "Split up a family of 4"
## 1122 "overall I was quite happy "
## 1123 "intentionally seat families separately"
## 1124 "not use or recommend Ryanair"
## 1125 "a low quality airline"
## 1126 "check in my hand luggage"
## 1127 "will pay extra to fly with another airline"
## 1128 "didn't we regret flying this airline"
## 1129 "guess that money is just lost"
## 1130 "would not reimburse us"
## 1131 "we had a very positive experience"
## 1132 "I will avoid this airline"
## 1133 "not recommended"
## 1134 "efficient service on board"
## 1135 "You get what you pay for"
## 1136 "hand pick the rudest staff"
## 1137 "I would fly with Ryanair again"
## 1138 "Staff were good again and friendly"
## 1139 "a blatant money making venture"
## 1140 "I was one of the last to board the plane"
## 1141 "a good airline, no hassle"
## 1142 "will try to avoid them at all costs "
## 1143 "forget luggage in the cabin"
## 1144 "extremely rude employees"
## 1145 "insufficient time for a thorough clean"
## 1146 "causing delays to the cabin trolley service"
## 1147 "entirely disorganised and messy"
## 1148 "Avoid if you can"
## 1149 "many difficult passengers onboard"
## 1150 "assigned separate seats"
## 1151 "allocated separate middle seats"
## 1152 "a flawless, efficient flight"
## 1153 "Boarding was somewhat shambolic"
## 1154 "vow never to fly Ryanair again"
## 1155 "Ryanair could stoop to this low"
## 1156 "split me and my girlfriend"
## 1157 "attitude of that wonderful lady"
## 1158 "splitting up family groups"
## 1159 "will be choosing a more expensive option"
## 1160 "the flight was excellent"
## 1161 "a new scam for me."
## 1162 "put off to book Ryanair again"
## 1163 "unprepared and overall messy"
## 1164 "Thank you so much"
## 1165 "well done to the airline"
## 1166 "thanks for getting us home the same day"
## 1167 "big thank you to the crew"
## 1168 "services are definitely not the best"
## 1169 "efficient, professional and friendly"
## 1170 "use again purely for price"
## 1171 "getting better and better"
## 1172 "I found I'd lost my passport"
## 1173 "very warm welcome"
## 1174 "well priced efficient trip"
## 1175 "Manners cost nothing"
## 1176 "you cannot have high expectations"
## 1177 "Never flying Ryanair again"
## 1178 "the flight and staff attitude had improved considerably"
## 1179 "Ryanair are good value"
## 1180 "comfortable way to fly"
## 1181 "it was a very cheap flight"
## 1182 "won't be using Ryanair again"
## 1183 "Absolutely terrible experience"
## 1184 "I like flying with them"
## 1185 "found the cabin staff on both flights, as usual, very helpful"
## 1186 "great flight with Ryanair"
## 1187 "I would fly again with Ryanair"
## 1188 "good and uneventful flights"
## 1189 "Staff were good"
## 1190 "value for money was great"
## 1191 "Great value for money"
## 1192 "what a refreshing change"
## 1193 "Will be flying them again"
## 1194 "left us waiting around for ages"
## 1195 "for price product is superb"
## 1196 "staff member had a positive vibe"
## 1197 "cabin crew were distinctly average"
## 1198 "big thanks to the cabin staff"
## 1199 "delayed by over 2 hours"
## 1200 "did not feel as well looked after"
## 1201 "commend Ryanair's cabin and ground staff"
## 1202 "they proceeded to do absolutely nothing"
## 1203 "flights can be purchased for \302\24315"
## 1204 "amazed by the positive comments"
## 1205 "cannot find fault with them"
## 1206 "you get what you pay for"
## 1207 "exceptional service"
## 1208 "Ryanair really delivered"
## 1209 "waiting for boarding in a glorified shed"
## 1210 "everything ran smoothly"
## 1211 "a good experience, for the price"
## 1212 "exorbitant on-board prices"
## 1213 "very good ground service"
## 1214 "would fly Ryanair anytime at these prices"
## 1215 "crew were super and very professional"
## 1216 "certainly fly them again"
## 1217 "thumbs up for the ground crew"
## 1218 "plane was kept very clean"
## 1219 "a spotless modern aircraft"
## 1220 "amazing value for money"
## 1221 "very pleasant experience"
## 1222 "will use Ryanair again"
## 1223 "staff smart and friendly"
## 1224 "we didn't check-in online"
## 1225 "very positive overall impression"
## 1226 "incredible value for money"
## 1227 "the perfect airline"
## 1228 "Ryanair was what I expected"
## 1229 "refurbished plane excellent "
## 1230 "seem to have really upped their game"
## 1231 "flight attendants were nice"
## 1232 "welcoming and warm flight attendants"
## 1233 "40 minutes waiting for hand luggage"
## 1234 "couldn't be faulted any way"
## 1235 "paying premium for peace of mind"
## 1236 "constantly harassed to buy things"
## 1237 "you get what you pay for"
## 1238 "seats give enough leg room"
## 1239 "particularly unpleasant flight "
## 1240 "I would recommend Ryanair"
## 1241 "on time and good value"
## 1242 "website really easy to use"
## 1243 "you get what you pay for"
## 1244 "do not use this airline"
## 1245 "suggested if ticket is very cheap"
## 1246 "everything went very smoothly"
## 1247 "no apology, no explanation, nothing"
## 1248 "this was the last flight they were running short"
## 1249 "was surprised with the service"
## 1250 "they only had coffee left"
## 1251 "really can't say anything bad about Ryanair"
## 1252 "really great service"
## 1253 "crew as always were friendly"
## 1254 "re-routed to depart from Alicante"
## 1255 "bucket shop prices, bucket shop service"
## 1256 "very punctual and quick boarding"
## 1257 "staff generally unhelpful and unfriendly"
## 1258 "very poor value for money"
## 1259 "staff grumpy and just grunted"
## 1260 "cabin crew were very helpful"
## 1261 "Ryanair, shame on you"
## 1262 "very good value for money"
## 1263 "ticketing agent was rude"
## 1264 "very happy customers"
## 1265 "not even get an apology"
## 1266 "plane was littered from previous flight"
## 1267 "never missed a flight before"
## 1268 "for the price we paid, it was absolutely fine"
## 1269 "no meaningful help was offered"
## 1270 "consistent changing of goal posts"
## 1271 "staff pleasant and helpful"
## 1272 "not so cheerful staff"
## 1273 "an incredibly stressful experience"
## 1274 "ticket price wasn't really cheap"
## 1275 "seats are absolutely sufficient"
## 1276 Ryanair customer review
## 1277 "brilliant flight and staff"
## 1278 "straight through check in"
## 1279 "very satisfied with Ryanair"
## 1280 "efficient and enjoyable experience"
## 1281 "had no complaints"
## 1282 "will nickel and dime you"
## 1283 "one of the worst flight experience"
## 1284 "I had a good flight"
## 1285 "a total inconvenience"
## 1286 "service has improved too"
## 1287 "coffee and tea sold is diabolical"
## 1288 "just enough legroom"
## 1289 "streets ahead of easyJet"
## 1290 "flight has been cancelled"
## 1291 "cabin was clean and tidy"
## 1292 "above competitive rate for budget service"
## 1293 "experience was pretty poor"
## 1294 "staff polite and friendly"
## 1295 "was a terrible experience"
## 1296 "did not care what would happen"
## 1297 "everything went smoothly"
## 1298 "seats rather numbing after a couple of hours"
## 1299 "does what it says on the tin"
## 1300 "excellent and professional"
## 1301 "polite and professional"
## 1302 "fast boarding, arrived ahead of time"
## 1303 "cabin crew were enthusiastic"
## 1304 "another contented trip"
## 1305 "massive improvement on previous trips"
## 1306 "staff pleasant and polite"
## 1307 "just a money rip off"
## 1308 "I will use them again"
## 1309 "did what it said on the tin"
## 1310 "unhappy with customer service "
## 1311 "will fly Ryanair again"
## 1312 "lot of ground to make up"
## 1313 "more than satisfied"
## 1314 "friendly cabin crew"
## 1315 "couldn't ask for more"
## 1316 "crew were very good"
## 1317 "crew were very friendly"
## 1318 "helpful, efficient and friendly"
## 1319 "introduced priority bag drop"
## 1320 "crew were particularly cheerful"
## 1321 "overall would fly again"
## 1322 "3 hours of cold air"
## 1323 "won't be flying Ryanair again"
## 1324 "rubbish under all the seats"
## 1325 "service onboard was good"
## 1326 "happy to serve customers"
## 1327 "actually get treated well"
## 1328 "very pleasant staff"
## 1329 "Boarding was not a problem"
## 1330 "bearable for 2 hours"
## 1331 "I'll bring your change later"
## 1332 "everything went smooth"
## 1333 "Ryanair are getting better"
## 1334 "consider flying with Ryanair again"
## 1335 "rude and incompetent air hostess"
## 1336 "priority boarding crowded"
## 1337 "continue flying with Ryanair"
## 1338 "plane was clean"
## 1339 Ryanair customer review
## 1340 "cabin crews extremely nice"
## 1341 "nothing at all went wrong"
## 1342 "fine with the flight"
## 1343 "enjoyable journey"
## 1344 "worst possible flight"
## 1345 "a no hassle flight"
## 1346 "crew efficient"
## 1347 "value for money"
## 1348 "Simply not possible"
## 1349 "they do not have to pay out"
## 1350 "definitely fly Ryanair again"
## 1351 "Ryanair fit the bill"
## 1352 "cabin crew were miserable"
## 1353 "excellent value for money"
## 1354 "flight had been cancelled"
## 1355 "cabin crew were friendly"
## 1356 "everything was smooth and efficient"
## 1357 "make sure you get to the gate early"
## 1358 "staff on board were more interested in gossiping"
## 1359 "all very efficient"
## 1360 "fly with Ryanair again"
## 1361 "will use Ryanair again "
## 1362 "staff were helpful"
## 1363 "contempt for customers"
## 1364 "they are the worst"
## 1365 "my first and last time"
## 1366 "quick and very helpful"
## 1367 "very disappointing experience"
## 1368 "nickel and dime you"
## 1369 "ferry back to Lanzarote"
## 1370 "I can\342\200\231t complain"
## 1371 "absolutely disgusting"
## 1372 "delays out and returning"
## 1373 "good value"
## 1374 "positive changes in service"
## 1375 "joke of an airline"
## 1376 "seats so close together"
## 1377 "if I had a choice"
## 1378 "luggage verification less strict"
## 1379 "crew were professional and efficient"
## 1380 "most annoying airline"
## 1381 "service was pretty good"
## 1382 "Horrendous experience"
## 1383 "quick and efficient"
## 1384 "Cheap \342\202\25430 round trip"
## 1385 "cheap and effective"
## 1386 "not there to help the customer"
## 1387 "return a different matter"
## 1388 "it was chaotic"
## 1389 "cabin crew cheerful and pleasant"
## 1390 "made people sit in discomfort"
## 1391 "attitude is still miserable"
## 1392 "Ryanair simply doesn't care"
## 1393 "why such inconvenience"
## 1394 "Ryanair seats are tight"
## 1395 "not the best for this route"
## 1396 "very glad we tried them"
## 1397 "Fantastic value"
## 1398 "all sorts of hidden fees"
## 1399 "unimpressed to say the least"
## 1400 "utter chaos on board"
## 1401 "cannot ask for better value"
## 1402 "a more customer-friendly approach these days"
## 1403 "paid only \302\24370 each return"
## 1404 "won't be flying with them again"
## 1405 "Stansted ruins the experience"
## 1406 "flights comfortable"
## 1407 "no problems at all"
## 1408 "denied all the paid for benefits"
## 1409 "love that seats don't recline"
## 1410 "crew much nicer than before "
## 1411 "definitely fly Ryanair again"
## 1412 "brought forward my flight"
## 1413 "had a pleasant flight"
## 1414 "ill mannered Ryanair employee"
## 1415 "extraordinary treatment by Ryanair"
## 1416 Ryanair customer review
## 1417 "good value for money"
## 1418 "enforce baggage rule fairly"
## 1419 "clean planes with enough legroom"
## 1420 "either walk or not go there"
## 1421 "you know what to expect"
## 1422 "easiest way to fly short haul"
## 1423 "never again Ryanair"
## 1424 "rule changes have been for the worse"
## 1425 "I was pleasantly surprised"
## 1426 "nobody to help even though pre-booked"
## 1427 "staff were surly and officious"
## 1428 "boarding was a shambles "
## 1429 "familiar with the rules"
## 1430 "they've lost a sale"
## 1431 "I simply checked times"
## 1432 "didn't know their own rules"
## 1433 "pleasantly surprised"
## 1434 "must pay for anything"
## 1435 Ryanair customer review
## 1436 "that is good value"
## 1437 "cost difference is now negligible"
## 1438 "aircraft quite new"
## 1439 "type of deceitful behaviour"
## 1440 "the pricing is fool's gold"
## 1441 "did not see a need to read AGBs"
## 1442 "departure on time"
## 1443 "never again with Ryanair"
## 1444 "flying at its least pleasurable"
## 1445 "went out of their way to accommodate"
## 1446 "poor customer service"
## 1447 "Overall a pleasant ride"
## 1448 "a much better experience"
## 1449 "consider flying Ryanair again"
## 1450 "25 euros for return ticket"
## 1451 "read the terms and conditions"
## 1452 "Don't fly Ryanair"
## 1453 "they added 60$ fees"
## 1454 "departing an awful experience"
## 1455 "I got stung for 50 euros"
## 1456 "intentionally difficult to find "
## 1457 "appalled by their behaviour"
## 1458 "last time we are flying with Ryanair"
## 1459 "called my honesty into question"
## 1460 "the cheapest airfare"
## 1461 "worst check-in experience"
## 1462 "improved their service"
## 1463 "gobsmacked to be charged \302\24350 extra"
## 1464 "experience could not be faulted"
## 1465 "Ryanair reps very evasive"
## 1466 "Shame on you Ryanair"
## 1467 "staff well rehearsed and diligent"
## 1468 "money well spent"
## 1469 "cheap and staff cheerful"
## 1470 "A steal for \302\24340 return"
## 1471 "good service and reasonable price"
## 1472 "cabin crew need some consideration"
## 1473 "you realise their service is quite flaky"
## 1474 "was great value for money"
## 1475 "won't fly with Ryanair again"
## 1476 "generally had no cause to complain"
## 1477 "pay 50\342\202\254 per person service fee"
## 1478 "seats are very uncomfortable"
## 1479 "just stick to the rules"
## 1480 "You get what you pay for"
## 1481 "cabin crew were friendly and polite"
## 1482 "I would not like to fly them again"
## 1483 "there were no hot meals onboard"
## 1484 "A very good experience"
## 1485 "without a doubt the worst airline"
## 1486 "does what it says on the package"
## 1487 "flight was smooth, comfortable seats"
## 1488 "cabin crew were amateur at best"
## 1489 "Read the terms and conditions"
## 1490 "crew cursed out loud more than once"
## 1491 "refused entry for being 30 seconds late"
## 1492 "get what you pay for with Ryanair"
## 1493 "I will never travel with Ryanair again"
## 1494 "bad situation made worse .... fly with Ryanair"
## 1495 "What is wrong with these people"
## 1496 "our difficulty checking in"
## 1497 "encourage not to fly with Ryanair"
## 1498 "not an acceptable service"
## 1499 "dupe people into running up fees"
## 1500 "I would give it zero"
## 1501 "worst airline I have ever flown"
## 1502 "the most uncomfortable flight"
## 1503 "Ryanair have given me no explanation"
## 1504 "food is bad and too expensive"
## 1505 "Ryanair fleet seems to be ageing badly"
## 1506 "superior couldn\342\200\231t care less attitude"
## 1507 "never fly with them again"
## 1508 "I got the worst service"
## 1509 "sloppy is an understatement"
## 1510 Ryanair customer review
## 1511 Ryanair customer review
## 1512 Ryanair customer review
## 1513 Ryanair customer review
## 1514 Ryanair customer review
## 1515 Ryanair customer review
## 1516 Ryanair customer review
## 1517 Ryanair customer review
## 1518 Ryanair customer review
## 1519 Ryanair customer review
## 1520 Ryanair customer review
## 1521 Ryanair customer review
## 1522 Ryanair customer review
## 1523 Ryanair customer review
## 1524 Ryanair customer review
## 1525 Ryanair customer review
## 1526 Ryanair customer review
## 1527 Ryanair customer review
## 1528 Ryanair customer review
## 1529 Ryanair customer review
## 1530 Ryanair customer review
## 1531 Ryanair customer review
## 1532 Ryanair customer review
## 1533 Ryanair customer review
## 1534 Ryanair customer review
## 1535 Ryanair customer review
## 1536 Ryanair customer review
## 1537 Ryanair customer review
## 1538 Ryanair customer review
## 1539 Ryanair customer review
## 1540 Ryanair customer review
## 1541 Ryanair customer review
## 1542 Ryanair customer review
## 1543 Ryanair customer review
## 1544 Ryanair customer review
## 1545 Ryanair customer review
## 1546 Ryanair customer review
## 1547 Ryanair customer review
## 1548 Ryanair customer review
## 1549 Ryanair customer review
## 1550 Ryanair customer review
## 1551 Ryanair customer review
## 1552 Ryanair customer review
## 1553 Ryanair customer review
## 1554 Ryanair customer review
## 1555 Ryanair customer review
## 1556 Ryanair customer review
## 1557 Ryanair customer review
## 1558 Ryanair customer review
## 1559 Ryanair customer review
## 1560 Ryanair customer review
## 1561 Ryanair customer review
## 1562 Ryanair customer review
## 1563 Ryanair customer review
## 1564 Ryanair customer review
## 1565 Ryanair customer review
## 1566 Ryanair customer review
## 1567 Ryanair customer review
## 1568 Ryanair customer review
## 1569 Ryanair customer review
## 1570 Ryanair customer review
## 1571 Ryanair customer review
## 1572 Ryanair customer review
## 1573 Ryanair customer review
## 1574 Ryanair customer review
## 1575 Ryanair customer review
## 1576 Ryanair customer review
## 1577 Ryanair customer review
## 1578 Ryanair customer review
## 1579 Ryanair customer review
## 1580 Ryanair customer review
## 1581 Ryanair customer review
## 1582 Ryanair customer review
## 1583 Ryanair customer review
## 1584 Ryanair customer review
## 1585 Ryanair customer review
## 1586 Ryanair customer review
## 1587 Ryanair customer review
## 1588 Ryanair customer review
## 1589 Ryanair customer review
## 1590 Ryanair customer review
## 1591 Ryanair customer review
## 1592 Ryanair customer review
## 1593 Ryanair customer review
## 1594 Ryanair customer review
## 1595 Ryanair customer review
## 1596 Ryanair customer review
## 1597 Ryanair customer review
## 1598 Ryanair customer review
## 1599 Ryanair customer review
## 1600 Ryanair customer review
## 1601 Ryanair customer review
## 1602 Ryanair customer review
## 1603 Ryanair customer review
## 1604 Ryanair customer review
## 1605 Ryanair customer review
## 1606 Ryanair customer review
## 1607 Ryanair customer review
## 1608 Ryanair customer review
## 1609 Ryanair customer review
## 1610 Ryanair customer review
## 1611 Ryanair customer review
## 1612 Ryanair customer review
## 1613 Ryanair customer review
## 1614 Ryanair customer review
## 1615 Ryanair customer review
## 1616 Ryanair customer review
## 1617 Ryanair customer review
## 1618 Ryanair customer review
## 1619 Ryanair customer review
## 1620 Ryanair customer review
## 1621 Ryanair customer review
## 1622 Ryanair customer review
## 1623 Ryanair customer review
## 1624 Ryanair customer review
## 1625 Ryanair customer review
## 1626 Ryanair customer review
## 1627 Ryanair customer review
## 1628 Ryanair customer review
## 1629 Ryanair customer review
## 1630 Ryanair customer review
## 1631 Ryanair customer review
## 1632 Ryanair customer review
## 1633 Ryanair customer review
## 1634 Ryanair customer review
## 1635 Ryanair customer review
## 1636 Ryanair customer review
## 1637 Ryanair customer review
## 1638 Ryanair customer review
## 1639 Ryanair customer review
## 1640 Ryanair customer review
## 1641 Ryanair customer review
## 1642 Ryanair customer review
## 1643 Ryanair customer review
## 1644 Ryanair customer review
## 1645 Ryanair customer review
## 1646 Ryanair customer review
## 1647 Ryanair customer review
## 1648 Ryanair customer review
## 1649 Ryanair customer review
## 1650 Ryanair customer review
## 1651 Ryanair customer review
## 1652 Ryanair customer review
## 1653 Ryanair customer review
## 1654 Ryanair customer review
## 1655 Ryanair customer review
## 1656 Ryanair customer review
## 1657 Ryanair customer review
## 1658 Ryanair customer review
## 1659 Ryanair customer review
## 1660 Ryanair customer review
## 1661 Ryanair customer review
## 1662 Ryanair customer review
## 1663 Ryanair customer review
## 1664 Ryanair customer review
## 1665 Ryanair customer review
## 1666 Ryanair customer review
## 1667 Ryanair customer review
## 1668 Ryanair customer review
## 1669 Ryanair customer review
## 1670 Ryanair customer review
## 1671 Ryanair customer review
## 1672 Ryanair customer review
## 1673 Ryanair customer review
## 1674 Ryanair customer review
## 1675 Ryanair customer review
## 1676 Ryanair customer review
## 1677 Ryanair customer review
## 1678 Ryanair customer review
## 1679 Ryanair customer review
## 1680 Ryanair customer review
## 1681 Ryanair customer review
## 1682 Ryanair customer review
## 1683 Ryanair customer review
## 1684 Ryanair customer review
## 1685 Ryanair customer review
## 1686 Ryanair customer review
## 1687 Ryanair customer review
## 1688 Ryanair customer review
## 1689 Ryanair customer review
## 1690 Ryanair customer review
## 1691 Ryanair customer review
## 1692 Ryanair customer review
## 1693 Ryanair customer review
## 1694 Ryanair customer review
## 1695 Ryanair customer review
## 1696 Ryanair customer review
## 1697 Ryanair customer review
## 1698 Ryanair customer review
## 1699 Ryanair customer review
## 1700 Ryanair customer review
## 1701 Ryanair customer review
## 1702 Ryanair customer review
## 1703 Ryanair customer review
## 1704 Ryanair customer review
## 1705 Ryanair customer review
## 1706 Ryanair customer review
## 1707 Ryanair customer review
## 1708 Ryanair customer review
## 1709 Ryanair customer review
## 1710 Ryanair customer review
## 1711 Ryanair customer review
## 1712 Ryanair customer review
## 1713 Ryanair customer review
## 1714 Ryanair customer review
## 1715 Ryanair customer review
## 1716 Ryanair customer review
## 1717 Ryanair customer review
## 1718 Ryanair customer review
## 1719 Ryanair customer review
## 1720 Ryanair customer review
## 1721 Ryanair customer review
## 1722 Ryanair customer review
## 1723 Ryanair customer review
## 1724 Ryanair customer review
## 1725 Ryanair customer review
## 1726 Ryanair customer review
## 1727 Ryanair customer review
## 1728 Ryanair customer review
## 1729 Ryanair customer review
## 1730 Ryanair customer review
## 1731 Ryanair customer review
## 1732 Ryanair customer review
## 1733 Ryanair customer review
## 1734 Ryanair customer review
## 1735 Ryanair customer review
## 1736 Ryanair customer review
## 1737 Ryanair customer review
## 1738 Ryanair customer review
## 1739 Ryanair customer review
## 1740 Ryanair customer review
## 1741 Ryanair customer review
## 1742 Ryanair customer review
## 1743 Ryanair customer review
## 1744 Ryanair customer review
## 1745 Ryanair customer review
## 1746 Ryanair customer review
## 1747 Ryanair customer review
## 1748 Ryanair customer review
## 1749 Ryanair customer review
## 1750 Ryanair customer review
## 1751 Ryanair customer review
## 1752 Ryanair customer review
## 1753 Ryanair customer review
## 1754 Ryanair customer review
## 1755 Ryanair customer review
## 1756 Ryanair customer review
## 1757 Ryanair customer review
## 1758 Ryanair customer review
## 1759 Ryanair customer review
## 1760 Ryanair customer review
## 1761 Ryanair customer review
## 1762 Ryanair customer review
## 1763 Ryanair customer review
## 1764 Ryanair customer review
## 1765 Ryanair customer review
## 1766 Ryanair customer review
## 1767 Ryanair customer review
## 1768 Ryanair customer review
## 1769 Ryanair customer review
## 1770 Ryanair customer review
## 1771 Ryanair customer review
## 1772 Ryanair customer review
## 1773 Ryanair customer review
## 1774 Ryanair customer review
## 1775 Ryanair customer review
## 1776 Ryanair customer review
## 1777 Ryanair customer review
## 1778 Ryanair customer review
## 1779 Ryanair customer review
## 1780 Ryanair customer review
## 1781 Ryanair customer review
## 1782 Ryanair customer review
## 1783 Ryanair customer review
## 1784 Ryanair customer review
## 1785 Ryanair customer review
## 1786 Ryanair customer review
## 1787 Ryanair customer review
## 1788 Ryanair customer review
## 1789 Ryanair customer review
## 1790 Ryanair customer review
## 1791 Ryanair customer review
## 1792 Ryanair customer review
## 1793 Ryanair customer review
## 1794 Ryanair customer review
## 1795 Ryanair customer review
## 1796 Ryanair customer review
## 1797 Ryanair customer review
## 1798 Ryanair customer review
## 1799 Ryanair customer review
## 1800 Ryanair customer review
## 1801 Ryanair customer review
## 1802 Ryanair customer review
## 1803 Ryanair customer review
## 1804 Ryanair customer review
## 1805 Ryanair customer review
## 1806 Ryanair customer review
## 1807 Ryanair customer review
## 1808 Ryanair customer review
## 1809 Ryanair customer review
## 1810 Ryanair customer review
## 1811 Ryanair customer review
## 1812 Ryanair customer review
## 1813 Ryanair customer review
## 1814 Ryanair customer review
## 1815 Ryanair customer review
## 1816 Ryanair customer review
## 1817 Ryanair customer review
## 1818 Ryanair customer review
## 1819 Ryanair customer review
## 1820 Ryanair customer review
## 1821 Ryanair customer review
## 1822 Ryanair customer review
## 1823 Ryanair customer review
## 1824 Ryanair customer review
## 1825 Ryanair customer review
## 1826 Ryanair customer review
## 1827 Ryanair customer review
## 1828 Ryanair customer review
## 1829 Ryanair customer review
## 1830 Ryanair customer review
## 1831 Ryanair customer review
## 1832 Ryanair customer review
## 1833 Ryanair customer review
## 1834 Ryanair customer review
## 1835 Ryanair customer review
## 1836 Ryanair customer review
## 1837 Ryanair customer review
## 1838 Ryanair customer review
## 1839 Ryanair customer review
## 1840 Ryanair customer review
## 1841 Ryanair customer review
## 1842 Ryanair customer review
## 1843 Ryanair customer review
## 1844 Ryanair customer review
## 1845 Ryanair customer review
## 1846 Ryanair customer review
## 1847 Ryanair customer review
## 1848 Ryanair customer review
## 1849 Ryanair customer review
## 1850 Ryanair customer review
## 1851 Ryanair customer review
## 1852 Ryanair customer review
## 1853 Ryanair customer review
## 1854 Ryanair customer review
## 1855 Ryanair customer review
## 1856 Ryanair customer review
## 1857 Ryanair customer review
## 1858 Ryanair customer review
## 1859 Ryanair customer review
## 1860 Ryanair customer review
## 1861 Ryanair customer review
## 1862 Ryanair customer review
## 1863 Ryanair customer review
## 1864 Ryanair customer review
## 1865 Ryanair customer review
## 1866 Ryanair customer review
## 1867 Ryanair customer review
## 1868 Ryanair customer review
## 1869 Ryanair customer review
## 1870 Ryanair customer review
## 1871 Ryanair customer review
## 1872 Ryanair customer review
## 1873 Ryanair customer review
## 1874 Ryanair customer review
## 1875 Ryanair customer review
## 1876 Ryanair customer review
## 1877 Ryanair customer review
## 1878 Ryanair customer review
## 1879 Ryanair customer review
## 1880 Ryanair customer review
## 1881 Ryanair customer review
## 1882 Ryanair customer review
## 1883 Ryanair customer review
## 1884 Ryanair customer review
## 1885 Ryanair customer review
## 1886 Ryanair customer review
## 1887 Ryanair customer review
## 1888 Ryanair customer review
## 1889 Ryanair customer review
## 1890 Ryanair customer review
## 1891 Ryanair customer review
## 1892 Ryanair customer review
## 1893 Ryanair customer review
## 1894 Ryanair customer review
## 1895 Ryanair customer review
## 1896 Ryanair customer review
## 1897 Ryanair customer review
## 1898 Ryanair customer review
## 1899 Ryanair customer review
## 1900 Ryanair customer review
## 1901 Ryanair customer review
## 1902 Ryanair customer review
## 1903 Ryanair customer review
## 1904 Ryanair customer review
## 1905 Ryanair customer review
## 1906 Ryanair customer review
## 1907 Ryanair customer review
## 1908 Ryanair customer review
## 1909 Ryanair customer review
## 1910 Ryanair customer review
## 1911 Ryanair customer review
## 1912 Ryanair customer review
## 1913 Ryanair customer review
## 1914 Ryanair customer review
## 1915 Ryanair customer review
## 1916 Ryanair customer review
## 1917 Ryanair customer review
## 1918 Ryanair customer review
## 1919 Ryanair customer review
## 1920 Ryanair customer review
## 1921 Ryanair customer review
## 1922 Ryanair customer review
## 1923 Ryanair customer review
## 1924 Ryanair customer review
## 1925 Ryanair customer review
## 1926 Ryanair customer review
## 1927 Ryanair customer review
## 1928 Ryanair customer review
## 1929 Ryanair customer review
## 1930 Ryanair customer review
## 1931 Ryanair customer review
## 1932 Ryanair customer review
## 1933 Ryanair customer review
## 1934 Ryanair customer review
## 1935 Ryanair customer review
## 1936 Ryanair customer review
## 1937 Ryanair customer review
## 1938 Ryanair customer review
## 1939 Ryanair customer review
## 1940 Ryanair customer review
## 1941 Ryanair customer review
## 1942 Ryanair customer review
## 1943 Ryanair customer review
## 1944 Ryanair customer review
## 1945 Ryanair customer review
## 1946 Ryanair customer review
## 1947 Ryanair customer review
## 1948 Ryanair customer review
## 1949 Ryanair customer review
## 1950 Ryanair customer review
## 1951 Ryanair customer review
## 1952 Ryanair customer review
## 1953 Ryanair customer review
## 1954 Ryanair customer review
## 1955 Ryanair customer review
## 1956 Ryanair customer review
## 1957 Ryanair customer review
## 1958 Ryanair customer review
## 1959 Ryanair customer review
## 1960 Ryanair customer review
## 1961 Ryanair customer review
## 1962 Ryanair customer review
## 1963 Ryanair customer review
## 1964 Ryanair customer review
## 1965 Ryanair customer review
## 1966 Ryanair customer review
## 1967 Ryanair customer review
## 1968 Ryanair customer review
## 1969 Ryanair customer review
## 1970 Ryanair customer review
## 1971 Ryanair customer review
## 1972 Ryanair customer review
## 1973 Ryanair customer review
## 1974 Ryanair customer review
## 1975 Ryanair customer review
## 1976 Ryanair customer review
## 1977 Ryanair customer review
## 1978 Ryanair customer review
## 1979 Ryanair customer review
## 1980 Ryanair customer review
## 1981 Ryanair customer review
## 1982 Ryanair customer review
## 1983 Ryanair customer review
## 1984 Ryanair customer review
## 1985 Ryanair customer review
## 1986 Ryanair customer review
## 1987 Ryanair customer review
## 1988 Ryanair customer review
## 1989 Ryanair customer review
## 1990 Ryanair customer review
## 1991 Ryanair customer review
## 1992 Ryanair customer review
## 1993 Ryanair customer review
## 1994 Ryanair customer review
## 1995 Ryanair customer review
## 1996 Ryanair customer review
## 1997 Ryanair customer review
## 1998 Ryanair customer review
## 1999 Ryanair customer review
## 2000 Ryanair customer review
## 2001 Ryanair customer review
## 2002 Ryanair customer review
## 2003 Ryanair customer review
## 2004 Ryanair customer review
## 2005 Ryanair customer review
## 2006 Ryanair customer review
## 2007 Ryanair customer review
## 2008 Ryanair customer review
## 2009 Ryanair customer review
## 2010 Ryanair customer review
## 2011 Ryanair customer review
## 2012 Ryanair customer review
## 2013 Ryanair customer review
## 2014 Ryanair customer review
## 2015 Ryanair customer review
## 2016 Ryanair customer review
## 2017 Ryanair customer review
## 2018 Ryanair customer review
## 2019 Ryanair customer review
## 2020 Ryanair customer review
## 2021 Ryanair customer review
## 2022 Ryanair customer review
## 2023 Ryanair customer review
## 2024 Ryanair customer review
## 2025 Ryanair customer review
## 2026 Ryanair customer review
## 2027 Ryanair customer review
## 2028 Ryanair customer review
## 2029 Ryanair customer review
## 2030 Ryanair customer review
## 2031 Ryanair customer review
## 2032 Ryanair customer review
## 2033 Ryanair customer review
## 2034 Ryanair customer review
## 2035 Ryanair customer review
## 2036 Ryanair customer review
## 2037 Ryanair customer review
## 2038 Ryanair customer review
## 2039 Ryanair customer review
## 2040 Ryanair customer review
## 2041 Ryanair customer review
## 2042 Ryanair customer review
## 2043 Ryanair customer review
## 2044 Ryanair customer review
## 2045 Ryanair customer review
## 2046 Ryanair customer review
## 2047 Ryanair customer review
## 2048 Ryanair customer review
## 2049 Ryanair customer review
## 2050 Ryanair customer review
## 2051 Ryanair customer review
## 2052 Ryanair customer review
## 2053 Ryanair customer review
## 2054 Ryanair customer review
## 2055 Ryanair customer review
## 2056 Ryanair customer review
## 2057 Ryanair customer review
## 2058 Ryanair customer review
## 2059 Ryanair customer review
## 2060 Ryanair customer review
## 2061 Ryanair customer review
## 2062 Ryanair customer review
## 2063 Ryanair customer review
## 2064 Ryanair customer review
## Comment
## 1 Flew back from Faro to London Luton Friday 2nd February. Ryanair in both directions was bang on time and smooth flights in both directions. We always sit in Front for more space and this was very comfortable for just under a 3 hour flight. The cabin crew were polite and efficient with nice sense of humour especially and engagement especially Ethan and his female colleague at the front section. For their human touch [unlike sometimes the stand offish BA crews] merit a 10/10 marking
## 2 Another good affordable flight with Ryanair. On time, pleasant staff at check-in and on board. We use Ryanair as our first choice on every flight we take.
## 3 Really impressed! You get what you pay for, this flight only cost \302\24319.99. The seats were soft, and there was tons of legroom! (not in an emergency exit) The cabin was spotless. The colours were a little bright but it was good. Cheap and no frills! Highly recommend, flies almost everywhere,
## 4 I should like to review my flight from Faro to Liverpool with Ryanair. I booked the seat with Ryanair several months before my planned travel and found the website clear and easy to use. Ryanair sent quite frequent emails relating to the flight and attempted to sell me extras. The check-in procedure was followed by a bag-drop at Faro Airport. This was not efficient and the app they recommended for speedy bag-drop did not work. Setting that aside, I was able to check-in my bag within less than 30 minutes of having arrived at the airport. Boarding was supposedly via group but this did not materialise at all. The cabin crew had a reasonable presence and delivered a serious safety procedure. During the flight the crew worked hard and had several rounds of drinks for sale. I found the seat suitable for a flight just under 3 hours. The flight departed on-time and arrived on schedule too. Disembarkation was delayed in Liverpool while this was not the fault of Ryanair, there was no communication with the passengers as to why this was the case. Disembarkation was not orderly and was poorly managed. Overall, a decent offering from Ryanair.
## 5 Flight left the gate ahead of schedule, fare was really cheap and cabin crew were welcoming and friendly. Flight was so much cheaper than Aer Lingus and flying with Ryanair is a much better experience.
## 6 Booked a fight from Copenhagen to Poland though booking.com Somewhere in the email from booking.com it states that checkin must be done online from home. I figure I'll do it in the morning since I have plenty of time. it's low season and I don't have any checked in luggage. I live in Copenhagen not far from the airport. Morning comes and I try to check in online. No luck, apparently they close online checkin 3 hours before the flight. I figure I'll just check in at the airport at those self serve terminals. I arrive at the airport 2 hours before my flight and head for a terminal. Prompt says: kindly go to service desk. Head for service desk. They charge me 42 euro to check me in. The flight itself was 57 euro. They almost charged me the price of the flight just to check me in manually! And they forced me to check in manually by closing online and self-serve checkin. This is Ryanair policy. Apparently. Wizzair and booking are not without blame either, as they decide who they want to do business with.
## 7 The flight itself is operated by Malta air and I've always found their cabin crew to be very pleasant and respectful. That however cannot be said for their handling agents either in Pisa or Stansted. The Stansted bunch I have found to be rude, argumentative and hostile. Like they hate their work. Boarding no matter where is a shambles. You're invariably stuck in a freezing cold or roasting hot stairwell even before your aircraft reaches the gate. It's not a pleasant experience. Nowhere to sit. As budget airlines don't use jetties at the gate there is every chance that you're gonna get soaked going to and from the terminal in winter. Cabins are not the worst that I've been on. I'm a wee guy so 2hrs 30mins isn't too bad. As far as cheap fares go, I've yet to get a Ryaniar flight that I found to be value for money. All I can say about the flights is that they are generally uneventful and again the Malta Air crew are welcoming. I found that once you add on all of their ridiculous charges they are really not better value than companies like British Airways. It is worth remembering that whether you like Ryanair or not it gives us a choice.
## 8 Staff is rude and has no manners, let alone be professional. I had a backpack with which I flew from Vienna to Paris through Ryanair without any issues. But while flying from Paris to Barcelona, they asked me to pay for the backpack. They have kept a small rack to check size of your carryon baggage, which is way smaller than the one we have in flight and as a result, high chances you will always end up paying. Because of this there was a long queue and one couple even missed their flight and instead of being considerate, they smiled and asked them to purchase ticket for another flight.
## 9 I wanted to check in online a night before our flight, but my nationality was not listed in their websites and when we wanted to check in in person they asked for a fee, and that still was not a problem! They asked for a credit card to check for late check-in fee, we asked them to pay by our debit card or by cash, but they did not accept it. So we missed our flight, and they made us pay a No show fee on the application so that they give us another flight in the evening. The flight we got was about 30 Euro and the no show fee we paid was 100 Euro. When I told them in Germany we can pay by debit card or cash, they said we are an Irish airline it has nothing to do with Germany! Then why do you have your business here? The other thing is when I mentioned my nationality was not listed on your website they did not accept that and they inserted my nationality manually!
## 10 Krakow to Tirana with Ryanair's subsidiary, Buzz, on a brand new Boeing 737Max-200. Flight departed early and arrived before schedule. Crew extremely well presented and professional. Ryanair does not have the most comfortable seats, and leg room is not the best, however for a 1 hour 25 minute flight I do not have much complaints. If you follow their baggage rules and basic online check-in, you won't have any issues. While they are the low cost airline I fly least in comparison to WizzAir/easyJet, I would willingly fly them again if given the opportunity.
## 11 This airline charges you for almost every thing. Every child needs to be seated with an adult. Got it, it is for Safety. But you must pay for the seat selection of the accompanying adult so that you can choose the seat next to the child. Only allowed a bag pack to be carried on for free, ay other cabin bag you must pay. You pay if you don\342\200\231t check in online. It\342\200\231s \342\202\25455 to check in at the airport. That\342\200\231s more than twice of my ticket price. No room for any negotiation. By the way, even if the flight is delayed and you have time to do online check in for free, too bad, just pay. They insisted that we have an email to inform us of this. Too bad if you ignored the email.
## 12 This is my tenth flight with Ryanair this year - and eight of the 10 flights had delays - usually between one and two hours, but we had more than three hours too! There is basically no way anymore that you can convincingly plan longer trips with them, for example a train journey after arrival, because you never know when you arrive. Today, we are loosing another train ticket that we bought ages ago in advance, when we still believed that some delays are exceptions to the rule, rather than the new rule. Even back then, we already calculated with a one and a half hour Ryanair delay, but that is just not good enough for that "never on time airline". To make things worse, according to EU law, they only have to pay compensation from a three hour delay, i.e. most delays go without any sanction, meaning a contribution from Ryanair for the additional expenses their customer have to pay. Long live neoliberalism? Add to that the non-existing Ryanair customer-sevice, which leaves you in the dark about new departure time, gate changes etc, and you have the worst package you can possibly buy. What can we customers do about it? At first, let us please stop buying drinks, food and other items on flights that come with more than half an hour delay. We should not reward such an airline for what they do to us. And then better check always the prices of competitors: Eurowings, EasyJet, Vuelin, Wizzair, anything that stays within a reasonable price for the package might be worth considering.
## 13 We have a return flight from Gatwick to Alicante. The issue started with online check-in. The application has constantly faild. At the end we make the registration front London to Alicante it was takes a lot of time. Even with this registration we cannot get boarding pass and gave to go to the desk. On the way came back we tried to make check-in online but it always faild. We have to go to the desk and make the registration. The airport charges us 30 euro per person. I tried send my issue to the Ryanair compliance dept, but all of the answers was like " Change device, you have to talk on the chat and etc" Just wanna get back my check-in fee . Nothing, just feeling you talked to a wall. I have very bad experience with the company and will try to avoid it in the future.
## 14 Couldn\342\200\231t find any reason to complain. Outbound flight on time, clean aircraft and Cabin Crew friendly and well presented. Great value for money. It was cheaper to fly to Dublin for the day on Ryanair rather than go to London from Bristol for the day by rail. Although the seats do not recline, I thought the leg room was fine. I have flown Ryanair several times over the years and have come to the conclusion that as long as you stick to the rules with regards checking in on line and adhere to luggage sizes, journeys are hassle free generally. Flight was late on the return leg but they emailed an apology before the dedicated check in time. That didn\342\200\231t bother me personally. Their website is designed to capture more money related to seat allocation, earlier checkin, luggage upgrades, insurance, etc etc but they are optional and as long as you know what you want, there is no obligation to increase the price of your journey. I find their website and online check in very easy to use. I\342\200\231m a pensioner and I\342\200\231m grateful Ryanair offers fares at great value.
## 15 The duration of this flight is 1h and 20m but we stayed inside the freezing plane one more hour, allegedly not Ryanair's fault but Lisbon's airport. Eventually they turned on the heat when it took off but when approaching Madeira the coldness was back. As usual, dirty plane.
## 16 Play the game and you'll be fine. Got a return flight from Leeds Bradford to Faro for \302\243101. I booked 3 months ahead, didn't reserve a seat, and took only a small bag. Had my boarding pass both on my app, and in paper format (just in case). Took my own food and drink on the plane, didn't buy any of theirs, and didn't buy any of their duty free etc. It really does pay to do your research. At Leeds Bradford someone had lost their boarding pass (I think that cost them \302\24360), while at Faro someone's cabin bag was too big. That had to go in the hold, and I expect that cost him. He said it was OK at Leeds, but maybe he got away with it there. My old bag would have been too big, but I checked Ryanair's website, and bought a new and conforming bag for \302\2439.99. I'm 6 foot tall, and the leg room is tight, but just about OK for a 3 hour flight. The seats were uncomfortable though and needed more cushioning. The outward flight took off and arrived on time. The cabin crew were friendly and efficient. No hard sales pitch for food, drink, duty free. The announcements could have been clearer, but that was down to the Portuguese captain. The return flight was about an hour late taking off, due to delays experienced earlier in the day. This happens. Allow for it. They made up 20 minutes and the plane landed at Leeds Bradford 40 minutes behind schedule. Absolutely no complaints whatsoever and fantastic value for money. I'd reckon that the negative views on here are hugely in the minority. In some cases things have gone wrong, but in others part of the blame must be with the posters who haven't researched and prepared well.
## 17 Most importantly Ryanair took me from A to B, safe and in a new plane. However, often flying with Ryanair is a tiring thing. The boarding process can simply be a pain as between scanning your pass and effectively letting you on the plane they let passengers stand in line for long time, often in cramped places. Surely it is to assure everyone is there, can board quickly and enable the closing of the doors of the plane on time, but is quite a torture (many other airlines try to avoid such thing, probably with more differentiation of boarding groups). Furthermore, on this specific flight, the crew truly was a pain trying to sell all kind of \342\200\234Duty Free\342\200\235 (non existing, as it was a domestic flight) items. The announcements took a full 10 minutes on a 60 min flight (sum it up with the safety instructions, buy on board of catering items, pilot\342\200\231s message(s) etc), reading out all kind of \342\200\234special offers\342\200\235 for more or less low ranking articles and was loud. Most \342\200\234refined marketing action\342\200\235 was the seat belts sign to be turned on, for no reason whatsoever (quiet flying conditions), to assure proper sales of articles.
## 18 One of the biggest rip-off companies out there. They give flights at good prices, and then will find any possible way to charge you additional money an make your trip as expensive as possible. Want to cancel your reservation within 24h from the purchase? Not possible. Need some time to choose which luggage you'll need? Be ready to pay double price for that, right after the booking. Want to change your flight? Double price just for the fees. They are tracking everything you do in their app to show you higher prices wherever they can. Customer service replies but doesn't help at all. 100% shameful company.
## 19 We were delayed for more than 8 hours at Oslo airport, Torp. We filed a complaint and Ryanair contacted me directly with this message and have now paid me more than EUR 500: "7 Oct 2023, 05:51 GMT+1 Dear Nils Erik, Thank you for your reply. We sincerely regret the delay on your flight FR3278 from Oslo Torp to Gdansk on the 12/12/2022. We wish to confirm that a transfer for the sum of 5652.02 NOK (equivalent to 250 EUR per customer and 386 NOK for meal expenses) has been authorised by Ryanair in full and final settlement of your claim under EU261." I am so satisfied with Ryanair for this.
## 20 Ryanair and we decided to book again for end of October. Unfortunately a war broke out in Israel and the whole world knows what is going on. I spoke to Ryanair Customer Service and explained that with the current situation with friends and family missing we can\342\200\231t possibly go on vacation, and if under the circumstances we can exchange our dates. I was told that the flight has not been cancelled by the airline and therefore we are not eligible for a change or refund. I find this indifference quite appalling from the airline, as no one is cancelling for the sake of it, and under these circumstances some leniency should be given by the company.
## 21 I have booked this flight as a part of an itinerary which included various others flights with other airlines. As a last minute situation (unexpected severe health issue) presented itself I had to cancel the whole itinerary and wanted to possibly reschedule the Ryanair flight. To my surprise I was confronted with the unpleasant situation in which there were no reasonable options. For any suggestion I proposed the company had a countermeasure/policy which will not allow me to make a change or if so, at a prohibitive price to the point that it would have been better to simply buy a new ticket. At the end the only option left was to cancel with no refund. It was truly very unpleasant to deal with Ryanair.
## 22 I booked 3 flights through Expedia. I received no specific policy nor check in requirements regarding this flight from Expedia. I was at the airport on day of departure and had to pay \302\243165.00 as a penalty to get boarding passes as I had not checked in online. I had no knowledge of this procedure, or fee. I had no choice but To pay this in order to fly with my sisters on this much anticipated vacation. I have repeatedly tried to speak with Ryanair to explain this gap in knowledge and unknown penalty fees.
## 23 I took a Ryanair flight three days ago from Copenhagen to Vienna without any problem. Today, I took the return flight. I was this time told I must pay a penalty fee for my identical bag. I told them I came three days ago with Ryanair, with the same bag. Ryanair\342\200\231s staff did not believe me. I offered them the ticket as proof. They ignored it and shouted at me to \342\200\230pay the fine or you cannot board the plane\342\200\231. I then removed a large duvet cover from my bag, after which the bag fit into their standard model box. Still, they ignored it, and repeated: pay or be left behind. Upon request, they also refused to give me their names, or the name of their manager. I must now reconsider my future choices.
## 24 People get quite angry about Ryanair, and I can well imagine that if something goes wrong you are really in trouble. But this trip was pleasantly uneventful. So long as you understand the baggage and other rules, and don't (for example) waste money on priority boarding, it can be fine. I paid for a seat at the front, and fast-track security at Stansted. The flights were both about half-an-hour late, but other than that I've no complaints. And there seem to be fewer annoying announcements on board these days.
## 25 Horrible, avoid at all costs. 28.8.2023 they cancelled my flight, they let me queue up for 7 hours. Refused to pay for transport and accommodation until my next flight 2 days later.
## 26 Charleroi - Carcassonne return. Both flights landed on time or ahead of schedule. Outbound was with one of their newer B737 MAX planes which offers less engine noise which was nice. Crew on the outbound leg friendly and efficient. Front crew on the return leg looked not motivated and not over friendly overall. Beverage and meal service efficient as always with good selections at ok prices. We have had no issues with Ryanair so far and they are often the only choice for certain destinations if you want a direct flight out of Belgium like in this case. Would still recommend them!
## 27 First time on 8022 and, although a nice aircraft and quieter than the 800, the seating is appalling. We were in row 26 and the pitch I measured at 27" - the least I have ever had to suffer. My knees were literally bruised blue afterwards and I did not buy a meal because it would have been impossible to eat it. I also had to wear my reading spectacles to read the information on the seat in front. Flight was on time and crew pleasant.
## 28 I had a flight from Charleroi airport Brussels to Athens through Ryanair, and booking that flight was one of the worst decisions I have ever made. I asked the boarding representative to book two seats next to each other (regardless of the location) for my wife and I. The representatives answer was no, and he said I have to separate you as per Ryanair policy because this is a paid service even though we had multiple seats empty on the air craft. Once I arrived to the airport, Ryanair representative informed me that I had to pay 55 Eur for each person for airport boarding because the online boarding (the free one) gets locked 2 hours before the flight because they offer cheap flights prices.
## 29 The experience was awful from the luggage check in to the boarding followed by an hour departure delayed. The wait before taking off in a 35 degree plane as the air conditioning was broken. Then we were told we will leave the gate in 7 minutes the translate to 30 minutes without any explanations. I will never spend a cent with this airlines. Incompetent rude ground and flight agents that will never see my money!
## 30 Ryanair is now obliging passengers who buy airline tickets other than on its own website to go through a complex validation process that involves taking a photograph of their civil identification document (lots of attempts) and a photograph of the passenger's own face! The company always manages to do what it wants without obeying the rules of absolutely every other airline on the market. But I think this goes way beyond what is reasonable. The prices on Ryanair's website are always higher than in some online travel agencies. Very friendly, even charming crew.
## 31 We were three persons to fly and each paid more than \342\202\254 100 for a singe-way ticket to Alicante, without paying extra to choose a seat. The checkin at the airport was based on the Ryanair app, which was confusing. Luckily a staff came to help us, verified everything and sent us towards the gates. At the gates it turned out that the flight was overbooked, there were 2 tickets more sold than there were actual seats on the plane, and because we didn't choose our seat we couldn't board the plane. We had to wait until the end of boarding to see if there were at least three no-shows, and then we would get their seats assigned to us. If everyone showed up, we wouldn't be able to fly. I didn't pay 100+ euro per ticket to not even be allowed on the plane because it's overbooked! Ryanair is the worst possible experience.
## 32 They set more traps for you than ever, in the end you pay more in the worst conditions: 1) You pay for a 10kg suitcase but it is not clear that you have to check it in and then you pay a \342\202\25445 penalty to have it taken down to the hold. 2) Check-in at the window with commission! 3) The staff (employee number 509566) is not there to help you but to annoy you even more. Not only does he treat you badly, but he also tries to penalize you even more. 4) During the entire flight they use the public address system for advertising, ridiculous. 5) All the landings are horrible, it seems like they do it on purpose. 6) They break your suitcase. Not recommended unless there is no alternative.
## 33 We booked this flight because it was cheap and was supposed to get us to Bristol with 3 hours to spare for our connecting. In Beziers, all passengers were stuck for 5 hours in a hot, poorly air conditioned waiting room. No information was provided on departure, just delayed. Found out that Ryanair doesn't have a single employee at this airport, not 1. Finally the flight left and landed late night at Bristol, 2 hours after our connecting flight departed. We filed claims for rebooking our connecting flight, the hotel that we were charged at the other end (24 hour no cancel policy) and the hotel in Bristol that we had to take. Ryanair only paid for the connecting flight rebooking. We are out of pocket over $600. They admit it was a mechanical problem with the plane that was fixed well in time for the light to leave on time but they had no maintenance staff at the airport to sign off on the minor repair. They had to fly in a maintenance person to sign off on it. 5 hours later we left. Horrible, horrible airline. Horrible communication. I called their customer service line (which is was difficult to even find) and they charged my credit card $50 just to take the call!
## 34 I bought the ticket literally at the last minute, and it was very expensive. Crew were efficient; some were friendlier than others. On such a short flight (one hour) I just want to get from A to B safely and on time, and Ryanair did the job.
## 35 The Ryanair app would not recognise my reservation. At Knock Airport, I was asked to show evidence otherwise that the app would not allow me to do the check in, otherwise I would have to pay a \342\202\254110 fee. Evidence shown, then told 3rd party booking that's why it doesn't allow the log in. Which part of: I cannot log in as Ryanair do these people not understand. The manager was the worst! No understanding, patience, nor sympathetic that I had 3 children under 5 yo with me and the check in for all of them was done save for mine and my father\342\200\231s check in. She made me pay the \342\202\254110.00 even after showing the evidence. Ryanair changes their rules as they wish and they will not care about this review as they are making enough money off of all us continuing to book with them!
## 36 Being relatively cheap doesn't entitle them to be disrespectful. At 19h already Google suggested the flight might be delayed as the previous flight was over 1h late yet they never bothered saying it was late- even past take-off time. People queuing and waiting all over the gate, but they don't care or bother to say their flight is late so they're perfectly comfortable wasting people's time and keeping them at the gate for no reason without information. So unprofessional and clearly there's not enough competition if they can get away with this kind of behavior and stay in business.
## 37 We experienced a very unpleasant conflict during the boarding process in Burgas, flight FR3705. Despite having no issues at check-in, we checked in our paid baggage and had four cabin bags for four passengers. However, we were forced to pay extra for a small suitcase because we were in the priority line after being called forward by the stewards. It was evident that they were struggling with the boarding process and thus opened both lines for everyone. After an unpleasant exchange of words, they took the suitcase from us and we had to pay an additional 46EUR, claiming that the suitcase wouldn't be allowed on board unless we paid. We eventually paid the money, received a tag, and the staff informed us that we would find the suitcase during check-in in Bratislava. None of this materialized. We were forced to paid 46EUR for a service that utterly failed. The way the stewards in Burgas communicated and coerced us was absolutely distasteful. While loading the rest of our baggage into the plane's storage area, the vast majority of suitcases similar in size to ours were accommodated without issue.
## 38 We were a group of 5 travelling across Europe and we went with Ryanair for one of our flights. Turns out this was our first and our last flight with them. Their staff is cold and seem like they hate their job. They charged one of us 30\342\202\254 to check-in one person. 30\342\202\254 just to print a small piece of paper? On top of that, they charged me 50\342\202\254 because my cabin bag didn't fit their testing tool, even though there was room for my bag to fit their over-head compartment. No other company charges 30\342\202\254 for check-in in person nor both forces you to test the size of your cabin bag and makes you pay in front of everyone. To add to the injury, the inside of the plane is very old and basic: small leg room, seats don't recline, no entertainment.
## 39 First of all, my ticket was not low cost. Flights from Athens to Vilnius and back, costed 340 EUR. I was charged extra for a small bag, which I have taken with me in the plane in 15 different companies. Oh, and paying that when you only have a digital card is a nightmare. Very shady fees, and rude customer service.
## 40 I would like to point out that the airline is a 'Budget airline' and it's pretty popular in Europe and north Africa, and RYANAIR is the most well known of them all for various reasons (mostly negative). BOOKING AND CHECK-IN: To book your flight like every other airline you do it online, through their website or their own app, booking a flight is easy enough and the first thing that will surprise you is how cheap tickets can get, some goes for less than 20 Euros, and many of them don't go over 100 Euros (depending on when you're booking), although that's very good you soon realise why the airline is hated, as when you choose your ticket you're bombarded with fees left and right for everything else besides the ticket. You have a big bag you want to take with you? That would be 30\342\202\254 extra. Want to bring a small cabin bag? You can only do that by buying priority Which is at least 25\342\202\254...etc the only thing you can bring is one backpack for free that weighs less than 10kg. They also try to sell you on offers such as compensation etc, but for the most part it's absolutely not worth it, so don't spend your money on them. In terms of checking you can do it for free only when there's less than 24 hours left on the flight online, if you come to check in at the airport you'll be charged 30\342\202\254 for them to check-in for you and give you the boarding pass, so keep that in mind! WAITING AND BOARDING: It's the day you take your flight! Remember that when you get through security, to look at the departures carefully, because 3 times out of ten they will change their gate (that's if they show you the gate early, they usually show it until there's less than an hour for the planes departure), stay alert! After that you during boarding you must wait until it's your turn (if you don't have priority) and go to your plane! In the boarding pass you printed or given they will tell you where to board, because Ryanair uses both the front and the rear for boarding people, and rarely use normal gates. After you've boarded, sit, relax if you can, because the seats aren't the best and they aren't reclinable. The food is also not free so if you want anything you have to pay (they also don't accept cash, only cards). END OF TRIP: And there you go, you've survived the trip with (hopefully) little to no extra money spent! All and all as much as this review is negative in many aspects, to be completely fair you get what you pay for, if you know what you're doing already and/or made research to be prepared you shouldn't have any problems! It's a very good airline for the fact they give such cheap tickets to people like me (a student) who can't afford "big airlines" and can go with only a backpack! It's also a different story if you go with your family or friends as in my situation all my flights in Ryanair were solo! Just watch out for their scummy behaviour to extract more money and try to not book the flight on third party websites. For me I'll give it a solid 6/10 because for many people like me the airline is a life saver, but it's definitely not for everybody to use.
## 41 A pleasant experience. Flight was a little delayed. Staff very attentive and cheerful. Flight was not fully booked, so there was some flexibility with seat choice. Good value for money.
## 42 When we checked back on the app for our flight home it was gone. Ryanair removed from our flights and sold the seats we paid for so we had to call them and finally we got our flights back but we were seated in emergency exit rows so we couldn\342\200\231t put anything under the seats. And the seats we paid for were sold to someone else. But the cabin crew are friendly.
## 43 A horrible airline. We will never fly it again. We had no choice but to fly this \342\200\234Dollar-Store\342\200\235 airline as it was the only one offering our route. The flight was late and we paid $300 in extra bag fees for 4 people. Also, we had to move our flight one day earlier and gave them 10 days notice. They only applied about 10% of the original ticket fee towards the new one.
## 44 Six of us (2 adults and 4 kids) had a very bad experience at Stansted Airport with Ryanair on 25/7/2023. We were there nearly 2 hours before departure time but we still missed our flight to Bordeaux. The queues were quite long and they sent us to the wrong queue even I asked them politely to get in the right one. When we had only 1 hour left I thought we might miss our flight. We asked them for assistance but they didn\342\200\231t do anything at all. Many staffs there were so tired and unhelpful. They didn\342\200\231t send is any emails about the fees for checking in at the airport and we were charged \302\243330 for it. Finally, we still missed our flight and had to be on \342\200\230standby\342\200\231 twice. It cost us a lot more money and time, ruined our holiday. It was totally exhausted. It was our first time with Ryanair and the last time as well. We will never use them again. They don\342\200\231t deserve even 1 star.
## 45 The worst airline ever. Our flight from Marrakech back to Berlin was canceled due to a strike in the BER Airport, Germany. Not only did they not pay compensation, but also do not pay my money back for the canceled flight. The money is now already for 3 months in my Ryanair Account and I have inquired like 10 times to pay me back the money to my credit card. I have even sent personal identity documents. Nothing - no reaction whatsoever. They are strictly ignoring me. Avoid Ryanair if you can!
## 46 Worst Airline I ever had to deal with. Super incompetent and unfriendly staff. It really was a nightmare. I booked my flights via booking.com and added check in luggage for 116$ on the airport I got told I appreciate don\342\200\231t have any luggage included although showing him the extra luggage fee I paid via booking. He could apparently not find it and I had to pay my luggage again in the airport for 95Euro. I also got told that it\342\200\231s mandatory when flying with Ryanair to online check in. Check in at the airport is only free if you are more then 2hour prior to the flight at check in desk. I arrived 2,5 prior my flight on the airport but I wasn\342\200\231t on the desk till 1:50 prior. So I had to pay another 55 euro to be checked in. When arriving on my gate there was a line for boarding. I had paid 20 euro extra for priority. I walked up to the desk and told one Ryanair woman that I had priority. She just said we called out priority 5-10 min ago if your weren\342\200\231t coming forward then now you have to go back in line with the rest. This has been a absolute joke and disaster.
## 47 Flight was delayed by 20 minutes, and one crew member was quite rude and had an attitude from the beginning of the flight for no reason. Leg room isn\342\200\231t great and as a 6\342\200\2313 person I had to sit in the aisle to stretch my legs. However, it is cheap
## 48 I recently missed a flight to France as the staff member at the gate had called final boarding and wouldn't let me on, even though I was 60 seconds behind my sister who they had let on the flight. The steps were still attached to the plane, the doors were open, and people were still finding their seats, yet the staff at the gate refused me boarding. I mentioned they had only just called final boarding (not gate closed, but final boarding) and her response was "don't listen to the announcement". I then had to pay for a hotel and another flight the next morning. I've complained to Ryanair and they've sent a generic response about getting to the airport 2 hours early. I was there 3 hours early and seconds behind the other passenger.
## 49 The single worst airline I have ever flown with in my whole life. I have flown with Ryanair about a dozen times and probably 10 of them were late by more than an hour. Not to mention the inexcusably rude treatment customers receive. Unprofessional. It may be cheap but it feels even cheaper than it is. Cherry on top, had to wait another hour for the suitcase.
## 50 Boarding was the normal scramble with people rushing to get into line at the Gate and wanting to be first on. Total waste of time and money paying for Priority Boarding when you have allocated seats Quick turn around meant aircraft hadn\342\200\231t been cleaned. Crisps and biscuits all over the floor around the seat. Normal crew members more interested in selling food and lotto tickets rather than concentrating on safety. Real concern was the fact those sat in the over-wing exit row, two rows in front of us had plastic pint glasses full of beer they were drinking from during approach landing and taxi at Gatwick. So much for the so called final cabin checks.
## 51 They charge you \342\202\25455 per person just to check you in. No airline has charged me for checking in. If you don\342\200\231t pay this you are not able to board your flight! Beware of these scams.
## 52 We took Ryanair for all of our flights within Europe. 3/4 of flights were OK except that they were all at least 1 hour late. I was OK with this and was expecting this based on their reputation. On our flight from Berlin to Venice, we were re-routed and had to land in Verona about 1.5 hours from Venice (Treviso) due to a major storm. Ryanair has no ground staff to assist people which is why they can be 'budget'. We landed late at night and 3 other Ryanair flights also landed in Verona due to the storm. There was a very nice lady employed by Verona Airport who was helping all the Ryanair customers. We were told to wait for buses arranged by Ryanair to take people from Verona to Treviso airport. People were fighting to get on the buses and we didn't understand why anyone would behave that way, considering Ryanair must surely know exactly how many buses they need to send based on how many flights/passengers had landed. Well, we were wrong. We also felt we should have been the last to go on the bus since all 3 other planes had landed before us and waited much longer. There were 40 people still left and we were told that the last bus was coming but it could fit only 16 people. Ryanair informed the airport over the phone that they would reimburse taxi fares for the remaining people. I am here to tell you that after months of back-and-forth email communication with Ryanair, they notified us that they do not need to reimburse us for a natural calamity since it's not their fault. I understand that's their policy, but I wish we were not misled to believe that the taxi cost would be reimbursed. If we had known what we know now, we could have taken a taxi as soon as we landed instead of waiting for 3 hours on the sidewalk outside of Verona airport. If you are flying with this airline, just hope that you don't end up with any special situation needing customer service, otherwise you are probably OK.
## 53 This airline will shake you down at the airport and charge you fees for anything they can. I followed every rule. One small backpack and still they charged 70 euros. Checked in online but there own barcode would not scan, cost 55 euros.
## 54 You get what you pay for with Ryanair. Uneventful flight left on time, friendly and efficient crew. Their website for booking and check in has become a bit of nightmare and can be very confusing, used to be lot better in the past.
## 55 Ryanair has a policy of charging 55.00 / passenger if they fail to check-in online prior to arriving at the airport. I spoke to customer service about this shameful policy, and wrote several notes to customer service. I received a cold, hard stare in response to the first and a meaningless form letter in response to the second.
## 56 Delayed for a reason or another. In flight you are bombarded with commercials, they try to sell you anything possible. Horrible airline, not recommended unless you are desperate.
## 57 The flight from Porto to Lisbon flight number FR9133 I became very ill - vomiting on the flight. The team went above and beyond with assisting me. I just wanted to thank Ana who ensured I was hydrated and gave me snacks to get my energy levels back up. Thank you to the Ryanair team on that flight.
## 58 We got ripped off when we went to counter to check in. They said we have to pay \342\202\254124 because I didn\342\200\231t check in online and I wasn\342\200\231t allowed to check in online at that stage. This is in addition to the delay and poor check in process. The total amount of our ticket was \342\202\254140 and we paid the same amount just for a check in.
## 59 Avoid like the plague. Ground crew is not helpful. We were unable to check in online due to a Wi-Fi failure on the airport. We expected some consideration from the Ryanair-staff. After a rather unpleasant conversation we had to pay \302\243100 for our boarding passes. But they only accepted credit cards which we didn't have. So we couldn't fly. Staff were ice-cold. That's how they are trained. Finally, a friend paid for us. But we had already missed our flight because of this. Now we had to rebook our tickets. Of course, again we received the emotionless treatment of the staff and an extra 200 pounds lighter, we were finally able to leave London Stansted Airport. Ryanair takes advantage of the fact people don't own a credit card, and they do this on purpose. It's just a low strategy to make a bit of extra money.
## 60 Ryanair is as basic as cheap flying can get. Your initial costs seem low but you should add the price of an additional passenger to your calculations, in case anything will go wrong. We booked two flights over Ryanair. Dortmund to Katowice and vice versa. As all cheap airlines, Ryanair has strict measurements for the size of the luggage you're allowed to bring. While boarding the machine on the first flight, Dortmund to Katowice, our Luggage was measured by the ground and fit into the Ryanair restrictions. While boarding the flight back the very same luggage somehow did not fit into size regulations, and we were charged an additional 310 PLN (about 71,82\342\202\254 at current rates) per piece of luggage. All that while other passengers that went by with visibly larger luggage were not asked to measure and could proceed to board unbothered by the ground staff. In addition, as we boarded the machine, the staff informed us that our Luggage would be too large to store it in the cabin, and had to be transported inside the cargo department of the plane. Which of course comes with extra waiting times at the airport. In addition, we booked a rental car at Katowice Airport over Ryanair. Of course, there where some problems with the booking and we had to cancel the booking and ended up paying about 70% more for the car as we initially would have.
## 61 Two on time flights with the return flight even landing 20 minutes early. Both flights very friendly cabin crew and clean cabin. Seats are not that bad and legroom space is not worse or better then other airlines. I have flown this route with Ryanair many times and surely use their services in the near future again. One more due compliment to ground staff in Charleroi checkin with two suitcases took exactly 30 seconds .
## 62 Ryanair cancelled our flight, never notified us by email or SMS (yes, I did check my spam folder), and we only found out by manually checking 2 days before the trip. They're now refusing any compensation, claiming they did notify us, but cannot provide a copy of the notification (of course). Never, ever, fly Ryanair!
## 63 Check-in was a bit hesitant, since the automatic suitcase acceptance did not work properly and there was hardly any support staff. The flight and the aircraft used were in excellent condition and there were no complaints.
## 64 Avoid this airline. They seem to be economical, but then you have to pay ridiculous add on fee even for a carryon. I went ahead and paid for a checked bag and a carryon (for each of us:2) because I didn't know what we would be traveling with. They send an email to check in the day before (like everyone) but also say you will be charged 30 euro if you don't check in online. The app is so confusing and chaotic. The record locator evidently doesn't indicate that you have already paid for luggage. There is no way to skip the screen (I was told later I should have just checked the box for undersea bag only for no charge) How was I supposed to know that? We both had suitcases and backpacks for overhead. So I had to pay again to even check in. I told them at the customer service desk what happened and gave my documentation showing I had paid twice. No refunds. Not under any circumstances. Boarding was late and chaotic. It was an awful and awfully expensive experience. Never again.
## 65 My recent flight with Ryanair from Lisbon to Stansted turned into a nightmare due to the behavior of two specific crew members. Their actions made the journey highly inconvenient for my family and several other passengers. It seemed their main objective was to extract extra money from travelers for baggage, which created a tense and unpleasant atmosphere during boarding. The trouble began when a passenger in front of us was forced to pay for their bag, even though it appeared perfectly fine from our viewpoint. We voiced our concerns, hoping for some empathy from the crew member. Unfortunately, this only seemed to provoke them to target us next. On a hot day in Lisbon, we had placed our jackets in a foldable bag, adhering to the baggage policy. However, as we were being briefed on the rules, we put our jackets on. After a discussion with a colleague, the crew member allowed us to proceed. While in the queue, one of my daughters, who has asthma, removed her jacket and hat. Suddenly, the same crew member appeared, ordering us out of the line and threatening to deny us boarding. Despite explaining that nothing had changed since they had previously allowed us through, they remained stubborn. They called another crew member over, and both of them joined in a verbal assault. They disregarded the fact that the extra bags were gadgets belonging to my child and wife, insisting that we could only carry four bags. Their behavior was not only rude and disrespectful but also unprofessional, displaying personal animosity and complete disregard for our well-being. It was evident that this crew member was actively seeking an excuse to single us out and personally target us. Our attempts to explain were met with increasing firmness, dismissiveness, and even mockery. Their conduct left a lasting negative impression, overshadowing what should have been a smooth and stress-free journey. I am deeply disappointed that Ryanair employs individuals who lack professionalism and take their frustrations out on innocent customers. This experience was disheartening, leading me to question whether I would choose to fly with Ryanair in the future. The treatment we received was unacceptable, and I sincerely hope that the airline takes this feedback seriously and addresses the conduct of its crew members.
## 66 Worst experience ever! I paid for my carry-ons. We flew originally from London to Edinburgh and nobody said anything about our carry-ons since we paid for them. 3 days after, on the way back from Edinburgh to London they said the carry-ons are oversized! I said they are the exact same carry-ons we flew 3days ago. The rep \342\200\234Mark\342\200\235 who was there when we boarded in June 17th at 5.55am flight to London, said that they were supposed to overcharge us on the way to Edinburgh. I said these carry-ons fit in the overhead bins. He said, if you want to travel without paying, then these carry-ons should stay! I paid the charge of almost 200 pounds and he never gave me a receipt. When I asked for a receipt, they said I will get it on my email. I never received anything and don\342\200\231t even know how much they actually charged me!
## 67 Please avoid this airline to book any flights, they give you false information about the gate just because you will miss your flight to reschedule next with double charges of your ticket. 4 hours waiting for my flight and last minute I found that gate information they gave to me was false. I go ask help desk to solve this issue but they just want to book another flight or pay 5 time more extra on your ticket to get evening flight. I spoke with one of the customer service manager but he said just a minute hold the call and after he disconnect my call.
## 68 I recently had an extremely frustrating experience with Ryanair that left me disappointed and dissatisfied with their service. Despite it not being mandatory to complete web check-in for my flight, I was unjustly charged a hefty fee of 40EUR due to an error on their part. Upon arriving at the airport, I was informed that I needed to pay the additional fee because I had not completed the web check-in process. However, according to Ryanair's own policy, web check-in is not mandatory, and passengers are still able to check in at the airport without incurring any charges. I found it incredibly unfair and frustrating that I was penalized for their own mistake. The customer service representative I approached for assistance was unhelpful and unsympathetic to my situation. They showed no willingness to resolve the issue or provide any explanation for the unnecessary charge. This lack of professionalism only added to my dissatisfaction. As a frequent flyer, I have had positive experiences with several other airlines that prioritize customer satisfaction and go above and beyond to rectify their mistakes. Unfortunately, Ryanair fell far short of these expectations. The incident left a sour taste in my mouth and has significantly impacted my perception of Ryanair as a reliable and customer-centric airline. The lack of transparency and the unwarranted charge have made me question their commitment to customer service and fairness. I strongly advise other travelers to be cautious when booking with Ryanair and to carefully review their policies and fees. It is disheartening to experience such disregard for customer satisfaction, and I hope that Ryanair takes this feedback constructively and works towards improving their service and rectifying their mistakes. Overall, my experience with Ryanair was deeply disappointing, and I cannot recommend them based on the unjust charges and lack of accountability I encountered.
## 69 I only carried a small backpack on my back, and a gift bag for my grandchildren, with two bears. The employee charged me 35 euros for the small gift bag. These people are prepared to rip you off. I will never return with this company. The mistreatment of passengers is unacceptable.
## 70 Ryanair provided a very punctual reliable service. Follow the rules and there are no problems! Friendly crew. My only concern was the steep stairs down to the boarding area at Stansted airport and no help for the elderly passengers.
## 71 My recent flight with Ryanair from Lisbon to Stansted turned into a nightmare due to the behavior of two crew members. Their actions made the journey highly inconvenient for my family and several other passengers. It seemed their main objective was to extract extra money from travelers for baggage, which created a tense and unpleasant atmosphere during boarding. The trouble began when a passenger in front of us was forced to pay for their bag. We voiced our concerns, hoping for some empathy from the crew member. Unfortunately, this only seemed to provoke them to target us next. On a hot day in Lisbon, we had placed our jackets in a foldable bag, adhering to the baggage policy. However, as we were being briefed on the rules, we put our jackets on. After a discussion with a colleague, the crew member allowed us to proceed. While in the queue, one of my daughters removed her jacket and hat. Suddenly, the same crew member appeared, ordering us out of the line and threatening to deny us boarding. Despite explaining that nothing had changed since they had previously allowed us through, they remained stubborn. They called another crew member over, and both of them joined in a verbal assault. They disregarded the fact that the extra bags were gadgets belonging to my child and wife, insisting that we could only carry four bags. Our attempts to explain were met with increasing dismissiveness. Their conduct left a lasting negative impression, overshadowing what should have been a smooth and stress-free journey. I am deeply disappointed that Ryanair employs individuals who lack professionalism and take their frustrations out on innocent customers. This experience was disheartening, leading me to question whether I would choose to fly with Ryanair in the future.
## 72 Be very careful when flying with this airline Even when their own app isn't working, preventing you from checking in online, they will still charge you for checking in at the airport. They charged me an extra \342\202\254165 to get me and my family home, even though it was their app that was at fault. \342\202\254165 to print off 3 pieces of card. When I complained to the airline I received an email explaining to me how to use the online check in, the same online check in I used for my outbound flight, the same online check in I tried to use for my return flight, the same online check in that wasn't working for my return flight. Presumably a stock response to fob off their most valuable asset, their customers. The flight itself was fine, no frills as expected, minimal legroom, as expected. The food and drink was actually quite good but expensive for what you got. Flight attendants were professional, friendly and attentive. Boarding wasn\342\200\231t ideal, crammed on to 3 buses to be taken to the plane, then only boarding at the front of the plane despite stairs also being at the back. I didn\342\200\231t check in any luggage, so I can\342\200\231t comment on this.
## 73 Another chaotic day of travel, with overcrowded airports, waiting, delays etc. Definitely no fun, but surely not the airline to blame for the frustration. Ryanair is cheap and is used by many people, and when you travel with it, you are one of them. No luxury to be expected, but this airline also doesn\342\200\231t pretend anything, which in these days I highly regard (compared with many so-called "Premium Airlines"). It is an airline, which doesn\342\200\231t make vague promises and sticks to what it is: a low cost airline, which will take you safely from A to B. Bring your headphones though, as constantly they are communicating about onboard sales, lottery tickets, phone cards etc.
## 74 An average no frills Ryanair flight. The plane was 20min late but that was not a problem. Staff was friendly and the flight pleasant. I recommend them as I've never had a bad experience flying with Ryanair.
## 75 The worst airline experience I have ever had. NEVER EVER use this airline, the staff were rude and unhelpful. I barely caught my flight, but if I had listened to Ryanair staff I would have missed it. I was travelling on my own with an infant and they showed no interest in helping me.
## 76 Terrible service! Unbelievable treatment of the people in Krakow! I have never seen such a lack of culture. They were charging all the people for the backpacks everyone is always traveling with (for example mine is the north face jasper). They took my little backpack away where I always travel with it and no one is making any problems. Now it will be all damaged, if I'd know I would wrap it! In any case it's the last time I use this airline. Not the first time not the last time I have problem with them.
## 77 We had a wonderful holiday in Italy which was dampened by the treatment of Ryanair staff at the Fiumicino airport. Ryanair disguises their prices as low, but they purposely try to trick you and find everything wrong with your booking when you are at the airport in order for you to pay extra fees (which you are forced to pay because you are desperate to get onto the flight). I first witnessed an older couple so excited to be on holiday but rudely told by the counter staff that they did not check in on time so they have to pay \342\202\254100. I was saddened by this as the couple looked so old and were taken advantage. They make it very difficult to check in online (you can only do it within a ridiculous timeframe) so once again you are forced to pay the fees. The staff at the counters before boarding also treated my sister like a criminal because her bag was a little larger then regulations. Screaming at her and embarrassing her, it was so sad. This is not how people should be treated when they are happy to go on holiday and work very hard to get time off. I implored with the staff that there was no reason to be rude. To top it off, when we arrived in Athens, our friends suitcase was broken. I would not recommend Ryanair and it would be better off going with another airline even if it costs more as you end up paying more with Ryanair after the additional fees they trick you into paying once you are at the airport.
## 78 Flight delayed by nearly two hours. Very little info given on the ground. Crew friendly enough in that Ryanair way where they're fine as long as you don't make them do any work or challenge them. Middle seat so extremely uncomfortable. Amused by how Ryanair make a huge fuss about arm rests being down yet will happily sell you a scalding hot coffee five minutes before landing! On board announcements very hard to understand as the crew were clearly non English speakers attempting to read from a script.
## 79 Uneventful flight. No delays. Ryanair crew were friendly enough by Ryanair standards! Window seat so not too uncomfortable. Usual multiple sales pitches squeezed into a 45 minute flight. Ryanair are never going to win any awards for service or comfort but that's not their intention. Considering the 15 euro fare, no complaints.
## 80 Paid extra for an extra room seat and didn't get it. Staff weren't interested. Very poor. I'll make a complaint when home. Staff tried lying to me until I showed the seating plan.
## 81 Just flown Alicante to Dublin. Great experience but flight late arriving due to heavy fog over the airport. My gripe is being herded like cattle in the pre-boarding area for over 30 minutes with no seating or toilets is very hard on elderly and infirm folk like us. We found that terribly stressful. Any benefit we got from our 2 weeks holiday, went in this animal pen we were traumatised by. But other than that, we had a good flight. Please act on this matter and improve our experience.
## 82 Avoid this airline at all cost! I lost so much money due to being late to pick up hire car and pick up my own car from car park after delayed return flight. Most Delays caused by technical issues. Old and very tight planes. No space for legs. After flight being delayed for over 3 hours we have been provided a vouchers for 4\342\202\254 each. The cheapest sandwich on this airport cost 7\342\202\254. What would happened if someone doesn't have any money? Won't be able to use this voucher at all because is simply not enough to buy anything. Staff very rude. I will never use this airline again and do not recommend it to anyone!
## 83 Worst airline ever. Dirty airplane and unpolite and rude crew. I personally assisted at a verbal aggression from one cabin crew against one passenger.
## 84 Paid for check in luggage, showed up to the airport already checked in with an hour to spare. Line to bag drop was astronomically long, couldn\342\200\231t get an attendant\342\200\231s attention. Eventually when I spoke to someone they said bag drop had closed and to go straight to the gate. Was charged an extra 90 euros at the gate to check my luggage. After multiple attempts I did not receive a refund for the original checked luggage payment or the fine at the gate.
## 85 The worst airline we have ever flown with. Exceptionally inefficient and very unfriendly staff. Long waiting lines, no priority check-in line despite paying the extra 'priority fee' for the whole family. We were traveling with an infant and the airline staff made us wait to board the aircraft last as they would not assist us with the stroller and gate check, despite a very unhappy baby. Made for a very unpleasant flying experience. because of the lack of willingness to assist us from the staff as well as their very unfriendly manners, we will never fly with Ryanair again.
## 86 We arrived at the airport in good time to check in one bag. We stood in the queue for almost 1,5 hours and finally dropped the bag. The gate was shown on the screen as "boarding"; me being 6 months pregnant I had to use the bathroom before boarding. We arrived at the gate about 20 min before departure, but were denied entry. The staff was really unfriendly and uncompromising.
## 87 Very smooth flight. Great terminal at MRS for LCC. Full of space and shops. Very quick boarding, and smiling crew. We paid for an excellent coffee. Unfortunately pitch on this specific B737Max was very narrow for a 2 hours flight, compared with competitors aircrafts available on same route.
## 88 There is a usual Ryanair bashing, because of their usual tendency to charge everything. Once, you accept it, and follow their rules, there is no point to complain. However in FAO, we have to wait by 30 degrees Celsius, standing (no seats) on the tarmac, in a cattle corral style, in front of the aircraft, during long lasting 20 mn. We did not like it. On the contrary of many pax, we had no kids, fortunately. Flight on time, clean cabin.
## 89 My return trip from Germany after a weekend away. Flight departed bang on time, and arrived 20 minutes early. As usual, efficient and straightforward service. Simple.
## 90 A quick flight from London to Dortmund for the weekend, to visit a friend. As has always been the case for me with Ryanair - perfect. They don't make any claims about being premium or special - they offer value and efficiency, which is what I got, as usual. Flight departed 5 minutes late, and arrived 25 minutes early. Efficient cabin crew, great value fare. If you remember that Ryanair is basically a bus with wings, you'll never be disappointed.
## 91 Overall quite satisfied with this Ryanair flight. Was on time and bags were delivered very rapidly. No entertainment or drinks but that\342\200\231s to be expected with a budget airline.
## 92 In 17/04 I took the flight FR15 from Stansted/London to Athens/ Greece. 1) Previous day, in 16/04, I spent 4 hours trying to check in, but their website kept failing, not allowing me to complete it. 2) Their "Chat-service" was useless, as I was chatting with a computer, NOT with a human, and computer couldn't offer a solution to my problem. 3) In 16/04, I emailed their Customer Service, but there was no help, apart from a general email. In 17/04, when I arrived in the airport, they charged me 55 pounds to do the check-in, otherwise, they wouldn't allow me to fly. I felt blackmailed. I showed them the emails I sent to their Customer Service the day before & I showed them the screenshots from my computer, proving that IT WAS THEIR WEBSITE that kept failing. They were adamant, in charging me 55 pounds for the check in. Ryanair, introduces itself as "a low cost airline", but THIS IS NOT TRUE. Surprise charges are awaiting the unsuspected customer. Never again with them!
## 93 A 40 min flight with Lauda operating for Ryanair. The plane was old and seat pitch was very tight, the crew was very friendly and professional. We had a delay but the captain kept us well informed. A pleasant experience and well worth the money.
## 94 Frankfurt Hahn to Vilnius return. Incredible experience. What I was mostly impressed with is ultimate efficiency of Ryanair, every process is executed very fast. No enormous queues anywhere - check-in, boarding/disembarkation and baggage claim were executed super quickly, none of these took more than 10 mins - which is very often a disaster when choosing "legacy" airlines. (In addition to that, there were no queues at security control as well at both HHN and VNO - but it's out of airline's responsibility). The cabin crew were polite and helpful, but not annoying - also an excellent job done. And - last but not least - of course, very reasonable fares. The only trouble was that the flight was slightly late (~20 mins) in both directions so I had doubts if I will be able to catch the bus for the following parts of my trip, but luckily everything went smoothly. Will definitely choose Ryanair for my future trips.
## 95 Very bad experience. The flight was delayed almost 4 hours. Had to pay for all refreshments which were ridiculously expensive although their policy said the refreshments were free if the flight was delayed more than 2 hrs which was. I will avoid this airline in the future.
## 96 Would like to pass a feedback to Antonio and all cabin crew who operated FAO-STN flight on 22nd of April. Grooming and customer service skills were met to a high standards. Friendly approach made a flight experience even more better and relaxed. Well done guys!
## 97 I had thought Ryanair would have improved over the years, but I was completely wrong. The cheap flights are completely offset by added charges. Firstly with bags, the size they provide as acceptable cabin bags are miniscule - barely enough to fit a days worth of clothes and items - so we purchased a cabin bag. The cabin bag they allow is the size of a usual carry on; the small wheeled suitcases so many people use. However when we got to check in, everyone with us (after the priority boarding) had these suitcases with no problem? We paid to have a bag checked in, when everyone else carried theirs on with no problem. That was \302\24355 extra. We then had to pay to sit next to each other, as I was travelling with my partner. We paid for this on one flight, and for the return flight we checked in as soon as online check in was open. Even though there were only a couple of seats already booked and the entire plane was empty, it deliberately seated us far apart in order to make us pay more. When it says they cannot guarantee you will be seated next to each other, take it to mean they will deliberately seat you far apart in order to get more money from you. Finally on the flight, having a flight attendant scream right next to you, as they yell at their colleague at the other end of the plane was interesting. Even more so was the aggressive way they do anything. I walk using a walking aid, and I called up to check this was ok before I boarded. After being told it was ok and that I would be able to keep the walking aid between my legs, an attendant roughly grabbed it on the flight and shoved it into an already full overhead locker, and then slammed it shut several times until it closed. This cracked and damaged the walking aid and I've now had to purchase another. When I submitted a complaint about this, I was told I needed to have filled in a particular form at the airport. I have never had an attendant damage the items I use to walk around before, and at no point does it say that if anything is damaged you need to fill in a form at the airport. I was then stuck in a loop of calling in to discuss this issue, being told to reply to an email and then being told they would do nothing as this form was not filled in. Ryanair remains a predatory airline - you will not pay the low amount you see online. Avoid them, and give your money to any of the other budget airlines if you're looking to save money. Will never fly with Ryanair again.
## 98 Got us late both ways. Also caused us to miss a following train. Saw confusion on their bags policy. A guy paid for it but they didn't allow him baggage for some reason, which wasted everyone's time. At arrival in London on return flight, they didn't open gate for 30 minutes after stopping the plane.
## 99 Bad company who seeks to take your money, extra costs from the moment you start your order to the last moment of the departure. The highlight was checkin in fine which will surprise you at the airport if you don\342\200\231t want to pay the extra cash for choosing a seat.
## 100 In my experience with flying with Ryanair in my opinion it is quite a good airline for the price. The seats aren't the comfiest but i haven't had any bad experiences with them so i would recommend them.
## 101 A pleasant flight for a decent fare and on time. Leg space remains a problem. Cabin crew were attentive and cheerful. What I appreciate most with them is that they try to achieve boarding and leaving the aircraft swiftly, as they are always on a rushed schedule.
## 102 Ryanair - only for masochists. We booked early. So we could have the whole Tuesday in London. Then the flight was moved to the evening. I tried to cancel, but with little luck. Waited 30 minutes for help on the phone. The instructions I was given didn't work. Gave up and decided to use the late flight. And then the flight was delayed by 1 hour. Arrived so late in London - all the restaurants were closed! Our Tuesday wasted completely. So - will try to avoid Ryanair in the future. There are other companies.
## 103 I always try to find the cheapest flight to wherever I need to go, and it always ends up being with Ryanair. But I will say, no matter what the price is this airline is awful. The bag requirements for baggage under the seat is way too small. My husband and I have fit numerous \342\200\234oversized\342\200\235 bags under the seat perfectly fine, but once in a while they will charge us almost \342\202\25450 for the baggage. That is way over priced for even what the app charges for an extra bag. Also again, it\342\200\231s ridiculous that I pack super light but they consider my bag too big just because it\342\200\231s a hiking bag. It\342\200\231s hard finding other airlines to fly and Ryanair is the most convenient one all the time but man do I hate flying with them. Also the staff when checking into the flight during boarding is always awful and so rude. I feel like they just always want to look for trouble.
## 104 Disaster customer service. Cancellation of flight and after reschedule requested airport check in. Waiting for service center agent took 1 hour and 21 minutes!!!
## 105 Ryanair cancelled my flight one day in advance. They choose not to disclose the reason for cancellation. The help desk was terrible; the representative did not speak proper English. My whole vacation, including the car rental (which I booked through the Ryanair website), must be rescheduled and will cost me at least hundreds of euros. Ryanair did not want to do anything and indicated that I needed to contact the car rental company myself. An absolute disaster - I will NEVER use this airline again and advise everyone else to do the same. DISAPPOINTING AIRLINE!
## 106 Keeping in mind that Ryanair is a low cost airline I have never had many troubles with it. That was until I departed from Valencia airport. The Ryanair staff at the airport was truly horrible. They made me pay almost 50 euros for a tiny purse I was carrying in my hand. They wouldn't give me the time to reorganize my backpack to have my purse fit into it, threatening me that I would miss my flight. I'm wondering if they get a premium for trying to milk extra money from their customers. They also forced me to put check in my backpack with my laptop in it. This had never happened to me before and I fly with low cost airlines multiple times a month. Extremely unpleasant experience.
## 107 Return flight ZAG-AGP-ZAG in mid - March 2023. Booking flights on the Ryanair app is easy and straightforward. Very reasonably priced tickets are bought 2 months in advance. Flights from ZAG are operated by Lauda Europe and their A320 in 180 seat config. Boarding was on time with a bit of queuing. The young and very enthusiastic crew offered very good service with lots of smiles. Both flights were on time. Onboard products are reasonably priced. Had just enough leg space (I was not touching the seat in front). No frills, but flights were definitely very good value for money.
## 108 Do not fly with Ryanair. They wouldn't refund the half of what you are entitled, I feel I have just been ripped off. They charged me \302\24355 at the airport for their website kept sending an error message. I showed the staff at the airport she tried through MyRyanair app too ,no success she then charged me \302\24355, and advised me to claim your money as there was a problem with their site! Now they say this money is nonrefundable! They change my return flight to another city in Germany which I was unable to make it I had to pay another \302\243100 to make my journey back to the UK on ferry. I paid almost \302\243200 for the priority return ticket and now they are refunding only \302\24341.70. The worst experience and costly flight with this horrible airline.
## 109 I have never had worse service than what Ryanair has given me. Shady, unfortunately not a good price and hidden between the line fines. Never experienced such unprofessional acts and will never recommend Ryanair.
## 110 What can I say about the appalling treatment we received. We arrived at the airport in plenty of time to find that the flight was delayed by an hour. We were due to fly to Dublin at 10 so we\342\200\231re loaded on the plane for an 11 flight not to much of a problem. We took our seats to be informed that there was a delay due to defrosting the aircraft, first off told 30 mins, then we were next in the queue, then told we were waiting for air traffic then told again waiting for defrosting, this went on for an hour and a half then they unloaded some passengers who were fed up with the delay and lies. We were then told we would be going soon. Asked if there was any chance of a drink and told they didn\342\200\231t have any then told I could have a bottle of water but it would cost me to which I laughed. We had a connection to Rome at 15.30 hrs we were told that they had contacted Aer Lingus to inform them we were on our way we then took off at 13.45 on arrival at Dublin we had missed our connecting flight and Aer Lingus knew nothing of this and we\342\200\231re informed by the very helpful Ryanair desk it was nothing to do with them. It was the worst customer service I have ever received. I will never fly with this awful airline again
## 111 I will never again book with Ryanair - the poorest customer service I have ever received in my life. We booked our flights out to Pisa (for our Wedding this August - 11 months later) last Sept and just 2 weeks after booking they changed our flights by 5.5 hrs going out and 7 hrs coming back. To add insult we paid for their most expensive flights to get good flight times to make the most of our Wedding holiday, as did 40+ of our guests too; and they put us onto their cheapest \342\200\230night flights\342\200\231 that are still selling online now dirt cheap. It\342\200\231s 4.5 months on since they changed our online booking (no notification, we just found by fluke by logging in), but when we rang they said they cannot change the flight until it is confirmed then we will \342\200\230receive an e-mail\342\200\231 to be able to request a refund or accept the new flights. I call every month and e-mail every month but I get the same text book answer \342\200\230you can change your flights when you receive your e-mail of the change, which could be up until 3 months prior to your flight date\342\200\231 - So Ryanair's customer service answer is wait 6 months until all other flight prices are sky high so we can\342\200\231t afford to request a refund and must accept our overly inflated cost of night flights, as we bought them under false pretenses. We have 10 children all under the age of 10 with us, some are babies and we\342\200\231re now stranded on a flight home at 10pm after we lose our accommodation at 10am, due to Ryanair's poor duty of care and customer service.
## 112 Their legroom is better than other low cost airlines and national flag companies. It is a breath of fresh air to fly on well managed airline. It is good to know one can count on them for the maintenance of competitive air fares on the routes they decide to operate.
## 113 I made the mistake of not booking my flight through their website, and as a result, they wouldn't let me check in online. When I arrived at the airport, they forced me to pay an extra 30 euro for onboard check-in, even though I had already paid for my ticket. This is nothing but a sneaky way for them to nickel and dime unsuspecting passengers. Not only that, but the staff were incredibly rude and unhelpful throughout the entire process. They seemed to take pleasure in making my experience as miserable as possible. I've flown with a lot of budget airlines in the past, but Ryanair takes the cake for being the worst. Their business practices are nothing but shady and underhanded, and I would never recommend anyone fly with them. Save yourself the headache and book with a more reputable airline!
## 114 Standard flight to Rome FCO outbound no frills, staff very strict on luggage. I took a small bag, brought own food, played by the rules. On return flight delayed by 1.20 hours back in Dub thankfully on time for bus. Toilets really manky on return, toilet paper stuffed in sink, mentioned this to staff and it was addressed. My main issue is with our flight schedule change. We were supposed to go on 6.20 am flight and were told by email and by contacting "ask Ryanair" that this flight was rescheduled, we got an option to change for free to the 4 pm flight. Our original flight did go at 6 in the morning and our tickets were sold at an inflated price. Memo: do not accept a schedule time, we were absolutely hoodwinked by their money grabbing tactics! If we hadn't accepted the schedule change we would have been on the 6 am flight!
## 115 Just flew Ryanair Bodrum to Dublin airport and the flight was just perfect. Very attentive and pleasant staff at the airport and flight was on time. Flight crew were very good and pleasant and attentive. My only gripe is, the seats are not comfortable enough for a 4+ hour journey. Other than that. Well done Ryanair and at an affordable price.
## 116 Yesterday we flew from Stansted to Budapest. The plane was supposed to take off at 17.45. (FR1331 Stansted Airport) We were informed that there was an issue that they had to check. As a result they didnt allow the plane to go. The main reason I am writing this review that I was extremely pleased with the staff's work quality. The stewards and stewardesses remained helpful, attentive, calm and polite. We were taken to another plane. This process was quick as everyone was sitting the plane took off. All the staff that took part in this process deserves a huge praise for their professionalism.
## 117 Unprofessional cabin crew. They removed my cabin bag from a locker without informing me about it and staff did not inform other stewards about it. I informed that my bag is missing and Ryanair attendants informed they cant help me and do not know who might took my bag. I was able to locate my bag after involving airport police. A stewardess hit my elbow with a food trolley several times and wasn't bothered to apologise.
## 118 I was told not to fly this airline for many reasons but I have and I flown this route many times the past year as a route from TLV to Paphos. There is nothing to complain about. Beside one flight they all left on time and arrived punctually the delayed flight was a short technical delay of 1 hour. Staff very friendly and professional. Prices are the cheapest in the industry. Food and beverage on board for acceptable prices and I will fly them again beginning of March.
## 119 18 hour 30 minute delay. At first a bird into the plane and they had to fly in another one, then boarded that one but the flight crew had been working too long so we had to get off. No replacement crew so delayed until 1.30pm next day. Did not leave until after 4pm, they had stopped responding to people asking why there was yet another delay. They have now said they are not liable to give us the eu 261 compensation as it was not their fault. Absolutely disgraceful.
## 120 Very basic but you get what you pay for, and I've never had any problems with them. Make sure all of your baggage is in order, and double check which airport you are flying into as it might be a secondary one in the city (eg. Berlin). The low price is impossible to beat. The service is minimal, but it's absolutely fine for short flights.
## 121 Flew Ryanair EDI/FUE/EDI. I can honestly say that it was very good both ways. It's true at the gate in EDI they were bordering on being militant with the hand luggage but at the end of the day the website asks multiple times how much you wish to take in the cabin so if people try to pull a fast one and get caught out it's their own fault. Crew onboard were professional and worked hard on both flights.
## 122 Flight was cancelled not Ryanair's fault it was French air traffic control - however, at the airport no one from Ryanair cared one bit, not one helpful staff member, I was sent from one desk to another no staff member had a clue what to do in event a flight was cancelled. Getting a refund was made very hard but I didn\342\200\231t give up, now I have a problem getting a simple email to verify my flight was cancelled, I need this for insurance claim for other expenses like car parking etc. Ryanair do not care one bit, I spoken to them on chat the staff are totally useless asking questions that are so irrelevant, then they send links that are also of no use, they are the worst customer service I\342\200\231ve ever dealt with in my life. I\342\200\231ve flown with them for decades but never again I\342\200\231d rather walk! Absolutely useless every last one of them, I\342\200\231ve sent about 30 emails and every time asked for a simple email saying my flight was cancelled they can\342\200\231t seem to be able to do it. Worlds worst company avoid at all costs.
## 123 Just flown Dublin to Bodrum direct. Plane was quite busy and I'm delighted Ryanair are doing this flight all year round. 2 minor complaints. We were herded like cattle on the stairs leading out to the plane for quite a time. Hard going when you are old and ill. And we were 40 minutes late taking off so incurred extra expense regarding our booked taxi. Other than that, attentive crew and lots of smiling faces. Ryanair are the best.
## 124 Cannot change the purchased luggage options from cabin to checked in. Ryanair forces you to purchase an additional bag for $30. Customer service is useless.
## 125 \342\202\25437 return per person from Cardiff to Faro and back. Both flights left on time. The e-check-in system was also good. Both flights were average. What you would expect on an ultra budget flight. Crew were friendly. However I was unlucky to get middle seats allocated on both flights. But for a 2 hour flight it was OK. I would definitely choose Ryanair, they indeed do come good on their slogan. Low fares. Simple
## 126 The flight was delayed 2,5 hours, then redirected to another city because the Berlin airport closed at midnight. Landed around 02.00 am in Hannover and offered a 4-hour bus trip to Berlin where we got around 6.00 am. In total: instead 22.45 pm arrival in the next day at 6.00 am with a whole-night travel. They send us an email that we will get compensation for the delay. But when I applied - the answer was that the delay was due to the airport technical delay not the company itself. So no compensation. Not to mention, they cancelled my flight to Italy two years ago due to COVID restrictions but didn\342\200\231t cancel the flight back. Never received any compensation for that as well. It just looks like economy but I would have saved money if I booked a better airline like easyJet (btw, they always return money if delayed). Never again.
## 127 My flight has been cancelled. I asked for a refund because I had to pay another flight. And it is impossible to get a refund. I tried all the possible way. But I never succeeded.
## 128 Bad customer service, they just don\342\200\231t care. Let you wait for 3 hours on the phone and do not assist at all. Not customer friendly. I would choose any other airline, but never Ryanair anymore.
## 129 Ryanair is a garbage airline. They delayed our flight 20 hours. Note - they didn't cancel our flight because then they would have to refund us. Our travel insurance wouldn't cover us because it wasn't a cancellation. Had to pay $4,000 for flights back to the US because of this cancellation. They told us we would be covered under the EU 261 law. However, because we booked through a third party, Hopper, they won't give us any compensation. Everything about this company is a scam. Don't ever book with them.
## 130 Boarding in a slaughterhouse queue in terminal 2, chaotic boarding, almost at a standstill at the front door of the plane, impassable corridor, no agility. In my seat was a lady who took the liberty of sitting there and pretended not to know her seat so that she could sit next to what I assume was her companion. When the flight attendant was called, she soon revealed her seat, but now the aisle was jammed and it was impossible to go to the front, so I sat in the seat that was possible, next to an individual who spent the whole flight bothering me and despite having a vacant seat by the window.
## 131 I had a nice trip to the sun last week from Dublin courtesy of Ryanair on the new MAX. Delayed outbound due to cold weather and lack of deicing equipment at DUB. Crew led by a very professional purser. Nice run back as well, played by the rules, brought my own grub, didn't book a seat, had a small bag. Have another flight booked for FCO in Feb and got an email to say it was cancelled and gave us a number of hours to accept the schedule change, it is not cancelled at all and they want to put us in the later on to see if they can sell tickets at an inflated price. Absolutely scandalous and complaint made to Irish Aviation authority. The alleged cancelled flight is still going albeit at an inflated price! Crooks with no conscience!
## 132 Outward flight More than 3 hours delay. First try for a return flight: More than 3 hours delay, cancellation of flight. No help with booking a hotel / transfer. Unfriendly staff Second try for a return flight more delays. Landing at the wrong airport, waiting more than 3 hours for a transfer to the right airport. Lies about the reason of landing at the wrong airport (they knew they couldn\342\200\231t land at Eindhoven because of the same problem as yesterday, and they still went for it. We had to book our own hotel / transfer, and we still didn\342\200\231t receive any money back.
## 133 The flight was really nice and the crew were friendly. There was a bit of a delay but the service I received made up for it, the loo was perfect and the food was yummy and hot. I also want to review the complainers, there are some making silly complaints, for example people complaining about having to pay \302\24360 extra for missing the check-in window, it is well advertised that you can check in at home on your tablet or computer, don't they have one? Also they are complaining about having to pay extra money to print out boarding passes, this is well known and totally avoidable if they actually checked in on their smart phones on the Ryanair app. Also they could of gone to a library to print out their passes for 30p? Some people just like to complain.
## 134 Bought tickets from Supersaver Helsinki to R\304\253ga, and I am an old customer with Ryanair, always been happy with fast service until now. Day before flight checked email, Ryanair app, no invite for online check in, so I thought. Going to do like normal people check in at airport, but now need to pay...and an adult and 2 kids check in for flight of 40 euros was 160 euros. And I asked any another way as I wasn't informed, in which I got told somewhere with small letter you can find info. I also explained I have travelled many times with Ryanair and always have got online check in but not this time and no info that you can't check in at airport computer...so I send same sad disappointment about service like that to customer service and just copy paste text. Also the guy at desk, wow, I must say I'm surprised he works at an airport, dead as dead person...at the end of the day, I'm sad that Ryanair didn't even try to understand situation and pretty much copy pasted texting, so I m gonna skin this company for my travel trips. Just because you are a cheap airline company doesn't give them the right to behave that way, you should consider reducing the fee a little less especially if it's a 50 min flight and price 15 euros.
## 135 Damaged bag. Ryanair promised to pay 50 EUR which I accepted (my mistake). It is more than 2 month now, and they are still struggling to pay this amount. Customer care is not reading documents provided and once in a month requesting the same information again. Non existent customer care.
## 136 Recently Ryanair's system decided that I'm a BOT and every time I book a flight since then they force me to pay extra for an online verification. Not only this, this online verification never works and causes a lot of stress. I sent a million of emails to them to resolve, none of which have ever been answered. I went to their customer service at the airport, they obviously had no idea what to do. I called the central customer service, the lady hang up on me. I have no words. This is the worst customer relation I can possibly imagine. Avoid flying with them if you possibly can.
## 137 Early morning flight with Ryanair FR4753 to Tenerife for a weeks holiday. Check-in opened early so headed through fast track security and was airside in about 15 minutes. Plane boarding was organised with priority on first which we took our seats 5A and 5B with ease. Legroom was as expected but slightly better. Crew were welcoming and professional and did a good service, really chuffed with serviced received. Plane landed about 20 minutes earlier than scheduled so happy easy and stress free start to my holiday
## 138 I\342\200\231ve flown Ryanair many times over the years. Fundamentally you do get what you pay for. Therefore I\342\200\231m reviewing based on its price appropriate. For a 50min I couldn\342\200\231t complain at all. Left on time arrived a few mins ahead. Small cabin bag, enough for the weekend.
## 139 Even though I am an American, I was offended how rude they were with Serbian people. I fly 50 + flights a year and I have never seen such rudeness. I found the culture of flight attendants to be rude and pathetic. I know it is a low cost airline, but kindness and smile should still be free.
## 140 A real nightmare, flight late, no info, just figured out, then hectic boarding in the rain, they made us wait and the plane was not there, in the cold, once the plain got there, a little bit more wait in the rain. Normal flight, when arrive no bus for the 2 group to unboard, when the bus arrived then a long wait for the crew to wrap up and close the plane, the cheap sometimes comes with a price and it is not good.
## 141 Ryanair just spoilt my holidays. They started boarding too early and kept people outside under the rain when the temperature was about 8 degrees during 40 minutes. The airplane wasn't prepared for boarding why? After that 2,5 hours flight like in the fridge. t the end I arrived with a cold and thanks Ryanair you spoil my holiday.
## 142 On the 6th of November, Ryanair charged me 45 euros for a suitcase that supposedly did not meet the measures required for the trip. My suitcase was very small, undersized and fit under the seat. Even so, they made me pay for an extra suitcase. The biggest problem was that I was not given a receipt and payment was made over the phone. They forced me to give my card details to a supposed telephone employee. They gave me the phone and said I had to give my card details otherwise I would have to leave my suitcase there. In addition to not having received any receipt as proof of payment, they kept my card details which should have been confidential. This is illegal. The antipathy with which they give us information and the menacing air make this company the worst I have ever traveled with. No dia 6 de novembro a ryanair cobrou-me 45 euros por uma mala que supostamente n\303\243o cumpria as medidas exigidas para a viagem. A minha mala era muito pequena, com o tamanho abaixo do standard e cabia de baixo do assento. Mesmo assim fizeram-me pagar uma mala extra. O problema maior foi que n\303\243o me deram um recibo e o pagamento foi feito por telefone. Obrigaram-me a dar os dados do meu cart\303\243o a uma suposta funcionaria por telefone. Passaram-me o telefone e disseram que tinha que dar os dados do meu cart\303\243o sen\303\243o tinha que deixar ali a minha mala. Para al\303\251m de n\303\243o ter recebido nenhum recibo como prova de pagamento, ficaram com os dados do meu cart\303\243o que deveriam ser confidenciais. Isto \303\251 ilegal. A antipatia com que nos d\303\243o informa\303\247\303\265es e o ar amea\303\247ador tornam esta companhia a pior com a qual j\303\241 viajei.
## 143 Ryanair cabin crew makes me worried as a passenger, they seem to be under enormous pressure, anxious, worried, sometimes with unnecessarily alarmed speech, other times with too slow or prostrate diction. The company tries to save on everything even when the passenger asks for a simple receipt for the service provided. The Irish authorities need to be brought to the attention of the EU to comply with consumer rights, particularly in terms of taxation. While Ryanair is largely responsible for stimulating the local economy, the social, tax and environmental cost is also very high. I will continue to complain to the Portuguese Tax Authority for this company to fulfil its obligations, not least because it is very keen to take advantage of national financial funds when available. Boarding on time, unfriendly crew and dirty planes.
## 144 When we boarded the aircraft they made us wait over an hour as they found a fault and decided to do a check\342\200\246the check should have been done before letting people board the aircraft. Firstly we were told that a new aircraft will be ready by 18:00 (the flight was at 14:30). At 18:00 we were told to wait till 21:35, at 21:35 we were told to wait till 3:30AM which after we were asked to wait till 6:10am, 6:10 am there was still no aircraft ready. I asked for an expenses form and no one could help me, the website would not allow me to change my flight free of charge like the email from Ryanair stated and when I asked a staff member for help once again their response was \342\200\234sorry we can\342\200\231t help you\342\200\235, After 10 hours of delay I asked the staff for help with a hotel and their response once again was \342\200\234sorry we can\342\200\231t help you if you chose to go it\342\200\231s at your own experiences\342\200\235 to which I asked if I were to go home and get some sleep and come back an hour before the flight is estimated would I be allowed onto my very delayed flight to which the response I received from the staff was \342\200\234we don\342\200\231t know we can\342\200\231t help you with that\342\200\235 for a \302\243250 flight and a total of 18hours of delay we received a \302\2433 voucher which was not even enough for a coffee and a bottle of water. I was so distressed and upset I decided to cancel my flight and retrieve my bags, just as I thought it couldn\342\200\231t get worse when I received my luggage back it came ruined and damaged! Once again I asked a staff member for help and I was told \342\200\234I don\342\200\231t know take pictures or something I can\342\200\231t help you\342\200\235. The two staff members were also very very rude, they were making very nasty comments about the non English speaking passengers who appeared to not understand English, calling your passengers \342\200\234stupid, annoying and idiotic\342\200\235 is very unprofessional especially when your answer to everything is \342\200\234I can\342\200\231t help you I can only show you where the exit doors are\342\200\235. I am completely shocked by this airline and it\342\200\231s staff at Bristol airport and will no longer use it and so won\342\200\231t my friends and family after seeing how the people were treated in this event and the damaged bags that were given back.
## 145 This review relates to my second flight with Ryanair following a trip to Fuerteventura. The check-in staff at Fuerteventura airport were very professional and friendly too. Boarding was something of a mishap as there was no reinforcement of the priority boarding. This caused an upheaval as several passengers, rightly voiced their grievances over this. This was a very full flight including several family groups. The cabin crew were far more professional than on my outbound flight and imposed a strict no nuts regime as a passenger had a nut allergy. One crew member stood out from her peers, who was not only very professional but seemed to go the extra mile to assist an elderly couple and to help a lady who was unwell. This crew member is a great credit to Ryanair and deserves recognition for her professionalism and common sense. During the flight 2 to-buys drinks and snacks rounds were performed and again the crew did very well indeed. Although there was a delay of circa 50 minutes to departure this was communicated very well to the passengers. Disembarkation was quite something as a problem passengers stood up before landing and ignored instructions to sit down. This passenger rudely pushed his away along the aisle and brushed a cabin crew member aside. Astonishingly poor behaviour. The cabin crew should not have to deal with such appalling behaviour. Overall a decent flight. The seats are not very comfortable though!
## 146 Stansted to Fuerteventura. Firstly, the airline deserves credit for an easy to use website. Follow the rules and one should be just fine within the remit of budget travel! I checked-in online without any issues and when I arrived at the airport, the priority boarding was largely enforced. The flight had a slight delay but communication was reasonable. Another let down was the poor attitude of two staff members. One lady seemed to do all the work while her colleagues took a back-seat attitude. I had a negative experience when I needed to use the lavatory. I politely asked a male member of the cabin crew if the lavatory was free? I am visually impaired. To my shock the staff member in question sighed and mumbled something in another language without answering my question. Disembarkation was a farce as the abusive woman and her brood pushed to the exit without any of the cabin crew correcting the dangerous behaviour eg standing up and removing bags from the locker before the flight had even properly landed. This was quite distressing for many passengers and a clear danger. Moreover the seats were very hard and uncomfortable and the charge for a soft drink was an outrage!
## 147 One of the worst airlines I have seen. There is no coordination among the staff. Initially the flight was at 3:15 pm CET, upon coming 3 hr early to the airport, we found the flight to be departed at 3.53 pm. When we went for the check-in, the staff told wait as the gates weren't announced. And after waiting, when boarding the boarding staff asked to pay for the check fine, which is complete non sense. There is no coordination among the staff. The ground staff are very rude and have no patience to Listen. This unacceptable.
## 148 Ryanair has customer service like it doesn't exist at all: they will say hello and goodbye and leave you as soon as possible. If you get into a problem emergent situation, their colleagues will lie to your face to get rid of you. Thanks to a Ryanair employee at Barcelona Airport, we lost our tickets and the ability to use them. Never again will I deal with Ryanair and such a disrespectful and inhumane attitude toward customers.
## 149 Malaga to Tangier with Ryanair. The problems with this flight included a lack of communication over a delay. I looked online and discovered that the flight was delayed leaving Dublin and thus arrived delayed into Malaga. The boarding process was a success in that staff enforced and reinforced the priority system. The aircraft was filthy and had trash on the floor and the windows were also unclean. The young cabin crew had little presence and did not deal with a group of rowdy Spanish teenagers. Disemembarkation was poorly managed too and this flight created a very poor image of the airline. I have been rather put off using Ryanair as a consequence of this experience. I shall add that some passengers only Spoke Arabic and that non of the cabin crew and none of the announcements were made in Arabic, I believe this is a safety issue.
## 150 Just flown with Ryanair. Flight was on time. Staff at check in desk very pleasant and welcoming. Staff on board the aircraft were very attentive and civil and smiling freely. Flight was good and soft landing. The check in desk let me put my 2 hand luggage cases in the hold free of charge as the plane was full. A very pleasing experience.
## 151 They seem to be providing a cheap service but you will be surprised when you get charged twice as much or even more of the original price. My wife and I had a short flight from Santorini to Athens on October 24, 2022 for which we paid about Euro 90 (45 each) in full, more than a month before the scheduled flight. During the past few days before our flight, I tried several times to check in online as I do with all other flights, but online check-in was not available so I decided to check in at the airport. To my big shock and surprise, I was forced to pay euro 62.15 per person to have our boarding pass issued. I had no choice because we couldn't miss our next flight from Athens to Toronto. After we landed in Athens and my phone was connected to the internet, I received an email from Ryanair asking to check in online with their special app but obviously it was too late for me. This is the first time I face such an unfair charge for such a simple service (issuing a boarding pass). I contacted them asking for a full or partial refund but they rejected my request.
## 152 Ryanair always pose themselves as "always on time". But really it is terrible company. NEVER on time. Very bad and NOT responsible company. All my last flights were minimum 2 hours delay. It is terrible.
## 153 Avoid this company at all cost. You start your journey smoothly with other companies but on the way back we have to deal with Ryanair that\342\200\231s when the problem starts. They want to charge whatever they can. They put cheap flights as baits but then they rip you off at the airport. Last time using this useless company.
## 154 Ryanair check-in in MRS has improved a lot. Priority boarding however remains a total mess, in a very narrow corridor. Staff on board was not smiling but act very effectively. Junk food (paid) remains junk. Very clean aircraft.
## 155 We get to the front to check-in, and we are late by 10 mins so they charge us each 55 pound to check-in (even though the flight was only 30 pound each), then the flight is delayed 3 hours. So we paid an extra 350 pound for nothing. That was from Glasgow to Dublin. Our next flight coming back to Glasgow from Dublin, we get to the gate, all line up in the stairwell, wait for 25+ mins, then they tell us all to come back out as they did not have a flight crew. So as we were exiting the stairwell, I told them there were elderly people standing on the stairs and the woman's response was "well don't fly Ryanair again." Then we finally get on the plane 2 hours later, and there's gum stuck to my seat and I had to get 2 different people to help as the first lady just gave me a napkin. And the second just rolled her eyes, then said there's a different spot. When we landed in Glasgow, once again we had to wait, as the pilot said "sorry but it seems there is no landing crew to guide us in." I am going to urge people to take the ladies advice and not fly Ryanair. Worst experience of my life. Negative stars if possible.
## 156 The airline racks on a whole bunch of unnecessary fees. They also delayed the flight by 5 hours and 18 minutes and by law they are supposed to compensate for the flight being late but they refuse. I absolutely hate this airline and will never fly with them again. And, on my next flight with Ryanair out of Malaga the staff were rude.
## 157 Budapest to Athens. Give me a reason to fly again. Poor services in everything. Cheaper airline? Of course no! If you add up all hidden costs and all trouble they cause you is one of the most expensive and worst in quality airline companies. Please please listen to me and think. I am sure you will understand why you should not fly with Ryanair again
## 158 I seriously thought we would never get home safely ... but that was not the only terrible part! After a nice week of vacation we take a Ryanair flight from Porto to Milan, estimated duration: about 2 hours (?). We are almost to our destination but we are told that we cannot land because of a thunderstorm. Result: we stay for more than an hour and a half suspended in the sky amid black clouds, lightning and thunders at close range. After that we are told that it will not be possible to land in Milan, so they take us to another airport (without telling us which one, except once we land!). We finally land in Genoa, tired but glad to be on land. Another hour and a half of waiting and we are told that we will be departing again? In the meantime, no one offers us water, food, but the captain tells us that we have "permission to contact family and relatives," if we desire. In the meanwhile, we contact our hotel to alert them to the uncertainty of the situation; they unfortunately warn us that it will not be possible to check in in the middle of the night (it was midnight by then). We arrive at Milan Linate and manage to catch the last shuttle to downtown Milan, where we squeeze into the first hotel next to the Central Station, in order to make as little distance as possible at midnight with baggage and personal belongings. Bewildered but exhausted and thus resigned, we pay three times the price of the hotel originally booked, which did not allow us to have a refund because of the short notice. Finally, once back home we decide to pursue a refund request (end of July 2022), promptly rejected because EU261 regulations do not provide for refunds due to "unforeseeable" conditions. We call support again, who suggests we ask for compensation instead of a refund (August 2022). In September 2022 I submit the request, in October 2022 I receive no response (waiting time described by the site for processing the request: 10 days), and decide to call the client support again. The operators, as always rude and annoyed, say they will send a reminder. I have no words for the incompetence of this company, their treatment of passengers (leaving them without water, food, explanations) is absolutely inhumane.
## 159 It all started what now seems a lifetime ago when sitting enjoying the sites of Lisbon City centre when my partner checked the Ryanair app out of mere curiosity to find our flight was delayed by over 3 hours. Inconvenient yes, but perhaps we could enjoy a few extra hours before heading to the airport? A quick chat with customer services should easily tell us if that's OK or whether we must be there for the original departure time. After 20 minutes of fighting the customer service chat feature we gave up. A completely automated response to all questions, none of which related to the query at hand. Fast forward to the airport - the main terminal looks nice but we get shuttled off to the budget terminal. Past security, not fun but not the fault of Ryanair at least. The delay is over 4 hours now so a quick search online shows we are entitled to food and drink. Best find a member of their helpful crew who will be happy to help! A walk of all the gates though provides slim pickings .. perhaps they don't want to help the people from the growing list of flights being delayed? When we did track down a member of staff at a gate, we were ushered through a gate to a Ryanair desk that could help, only to find on going through the door that it was a one way trip - back to the initial check-in slaughterhouse. I feel by this point we all know what the response was at the check-in desk - go and ask at the gate of course. We tried to argue briefly. We took the tickets, we accept our fate. At least the comforting knowledge we received from the checkin desk that someone will come out and offer help from Ryanair back at the gate will keep us warm over the upcoming hours of woe. Back at the gate now. Security was even better the second time around, apparently they don't like boarding passes being used twice. When we mentioned Ryanair though they seemed to get it. Not sure how many hours to go. Perhaps a member of Ryanair will come and offer assistance at some point. Perhaps even food. Or water. Even an update on the flight that keeps getting pushed further back. We can only wait and see.
## 160 Another great flight with Ryanair. Cheapest tickets on the market. Great, helpful staff. Flight bang on time. Smooth and efficient. Food and beverages available and super landing. My gripe is the seats were very uncomfortable and no leg room. Really hard on me as I'm in ill health at present and it's a fairly long flight. But that aside we'll done by my favourite airline.
## 161 We payed the small fee for a 10 kg small bag. But when we arrived at the gate check in, they charge us with a fee of 499kr. So dumb when we meet the recommended level for flying with your company. Hidden fees everywhere.
## 162 Ryanair is unfailingly the most horrific airline to fly with. Appalling customer service, attracts clients because of its seemingly \342\200\234cheap\342\200\235 tickets but there is always hidden fees somewhere. This time it was because i arrived to check in 1 hour and 45 minutes before flight instead of two hours - so got charged 30 euros. I had tried to check in for both flights at my departure destination as I knew I wouldn\342\200\231t have a lot of time at the transit stop to do the check in. Bad tempered Ryan Air staff told me I couldn\342\200\231t but she just seemed like she couldn\342\200\231t be bothered. I then got charged 30 euros at the transit stop because I had checked in \342\200\230late\342\200\231 (even though I had tried to do it 4 hours earlier). The thing that bothers me the most though is that they advertise \342\200\234free airport check in two hours before flight departure\342\200\235 but fail to mention that they will charge you if its less than that time, or how much they will charge you (they probably do tell you somewhere in small print but the spirit is one of being scammed). Hate this airline. Never using again.
## 163 Poor customer service. You can\342\200\231t even carry a small bag of clothes you have to pay for it. Badly handled customers and they dictate what to do with your bags. The flight was so disturbing l have ear aches all the way. It\342\200\231s uncomfortable to use and they were also late, the flight was delayed. I would rather use another airline. I don\342\200\231t mean to be rude but that\342\200\231s what l experienced
## 164 Had no choice but to fly Ryanair on this occasion to Budapest. Awful from start to finish. Both flights delayed by 2 hours. Got to experience their 737max...not at all pleasant, seats crammed in so you end up leaving with back pain. Non stop announcements throughout the flight like a flea market. Ryanair end up more expensive than a real airline by the time you add on the extras. Aer Lingus please, please, please start flying to Budapest again during the summer season and save me from Mickey Mouse Michael O\342\200\231Leary airlines.
## 165 Stansted to Maastricht. Overall I had a very positive experience! Check-in was efficient and the boarding process was well managed. During this short flight the crew were efficient and hardworking. My concern was that certain passengers were allowed to take far too much luggage while others were not allowed to take small bags \342\200\223 a lack of consistency where that is concerned! I also felt that there was a lack of communication from the cabin crew towards the end of the flight. Overall a decent experience!
## 166 Terrible experience. Ryanair leaves no stone unturned to extort money out of passengers pocket. Uncomfortable, not recommendable airline. Also, Special needs assistance request not entertained adequately. Overall very poor service.
## 167 I commend Ryanair for the professionalism of the crew on this flight from Brussels Charleroi airport to Liverpool on 28th August 2022. The cabin crew were amongst the most professional and personable crew I have encountered in several years of flying. One can but commend their attention to detail, friendly and firm manner in dealing with a few tricky customers who had too much luggage. The service provided on a rather short flight was a great credit to the company. I left the flight feeling I had been in safe hands and will book again!
## 168 This was the worst flying experience I have ever had. We paid $1095 for a flight from Paris to Seville for a family of 6. After taking the shuttle from Paris we did not check-in online prior to the 2 hour deadline. We were then forced to pay $330 (Euros) to check in at the airport. Then, the flight was delayed by 2 hours. Did my family sit on the floor in an packed concourse for 3 hours? Yes. This company is only out to get your money when you miss a deadline, have a bag that is too big or any of a host of other reasons. I will never fly Ryanair again. Any company that will hold me accountable for a mistake but not do the same when they make a mistake is not worth my business. I attempted to resolve this with the company but was denied multiple times even though any reasonable person can see the inequity in the situation. Save yourself a big headache and choose a different airline.
## 169 Often disappointed flying Ryanair. Its often expensive, airports are far away, any refreshments are payable. For me it is always a stressful experience flying Ryanair. Flying by a conventional airline from the nearest airport is almost always a better option.
## 170 My check-in luggage did not arrive and was located only 3 days after my departure. Ryanair then requested me to come back to the airport just to pick it up instead of delivering my luggage to my hotel. So Ryanair makes mistakes and requests customers to correct these mistakes. It is a very unprofessional company.
## 171 I flew internationally and tried to check in online the night before and the site timed out. I got to the airport 1hr 55min before the flight and tried again but was locked out of online check-in. I wasn't checking luggage. I just needed a boarding pass and was charged \302\24355 to print a boarding pass. Ryanair refused to refund the fee indicating I should have contacted customer service when the site timed out. As for the morning of, they don't allow online check-in inside 2 hours. To expect someone traveling internationally to call an agent when the check-in failed is not acceptable. Closing online checkin 2 hours before flight time seems excessive and coincidentally in line with when passengers typically would arrive at the airport.
## 172 The flight has been cancelled resulting with additional costs and lost part of the holidays. I have purchased an insurance with XCover through the Ryanair booking site and was hoping the lost money will be refunded however the XCover asked for proof of the reason for the flight cancellation and The email I have received from Ryanair did not state the reason. I have requested information from Ryanair but without response from them for few months now. When I contacted customer service they told me that the flight was cancelled due to commercial reasons however this cannot be sent to me in an email. When I asked if I can record the conversation for my confirmation the call has been disconnected. Nor information on reason for cancellation no money from XCover insurance company. This is their way of taking our money without accepting responsibility.
## 173 We arrived at Liverpool airport to fly to France. Seriously backward here, there\342\200\231s over 100 people trying to check in and there\342\200\231s 2 staff. This company never seems to please me, they will penny pinch at ever chance, it\342\200\231s never a good experience.
## 174 This low cost airline company is the worst I\342\200\231ve ever seen. They make you pay 65\342\202\254 to get your boarding pass at the airport. You cannot recline your seat. The crew was rude and unprofessional.
## 175 We arrived at the airport 4 hours before the flight and were told the airport desk is not open for check-in. We did not realise that with Ryanair you have check in online. When we finally got an open desk we were told that the check-in would cost 110 Euros. We were told that we had to check-in online, but that we can't do it anymore as the online check-in closed 5 minutes ago and we had to check-in 2 hours or longer before the flight. We have repeatedly contacted Ryanair regarding a refund, but zero response.
## 176 When I arrived at Stansted airport in London I realized the bag I had checked in had been left in Helsinki. The bag was sent to Stansted airport the following day, but the company could not transport the bag to my hotel so I had to go to fetch the bag myself. The journey to the airport and back to my hotel room took me half a day and I lost a lot of valuable time that was supposed to be used for sightseeing. As I was left with nothing but my passport and wallet on the day of arrival I had to purchase some essential goods. When I came back to Helsinki I claimed the money for those essential goods and some extra for the damages caused, but the company never return the money to me.
## 177 Had an issue with checking in online as it kept coming with an error. Tried to check in at the airport and were told we have to pay the checking fee (60 EUR) but we could then contact the customer service department with proof of the error and we should be able to get our money back. Send them screenshots of the details and 25 days later they replied saying they were not aware of any issues and no refund was due. Really cold and lack of empathy and I will try to avoid flying with them in future unless it's the only choice available.
## 178 After a horrendous journey to the airport, my husband and I arrived 90 minutes before flight. Having been ill on holiday I was exhausted. At checkin, staff were amazing, providing me with water, a seat and wheelchair assistance throughout the airport. Arriving at Stansted there was a vehicle to meet us. We were driven to passport control, where there was a wheelchair waiting for me. Straight through passport control to baggage collection where we were helped with our cases,then to the exit, where we were met by a family member. Thank you Ryanair, excellent service.
## 179 Ryanair denied check in access on line using Ryanair App and their website. We were compelled to report to the airport check in. The airline charged $110 to print our two boarding passes. We presented 2 Ryanair staff evidence of our good faith effort to check in on line and on app 2 hours in advance of the flight. They ignored us and refused to issue our boarding passes for flights we had paid for without paying $110 for the printed passes. When I asked for recourse, they gave me a phone number that was not legitimate. the second phone number they provided required a long queue, and when we finally got through, the agent relayed that they had no authority to help us. We were directed back to the airport staff who volleyed us between the phone number and them and ultimately charged $110 to print 2 pass.
## 180 Actually a pleasant flight, probably because it was nearly empty because The Netherlands were by then in a lock down. One tends to think everything is down scaled with FR: in reality it isn't if you compare it with some European more traditional airlines. They also let you pay for luggage, a preferred seat, food and drinks. As long you do your homework beforehand and you have gone through the fine printing, and you do not pretend to find First Class at low cost, all is quite efficient and straightforward, as it was with this flight.
## 181 Chania to Stockholm. It's absolutely the worst I have ever ever experienced in my life. Both ways the were delayed without giving out any information how long. Let us wait with out information by the gate for 2 hrs then boarded us on in their small tight seats that you can not regulate in any way. Ones on the plane they tell us they lost there slot to leave and we had to wait in the plane for another 1:40 minutes. Same thing happens going back to Stockholm!! So awful and absolutely no service while we are all stuffed as sardines just waiting on to take off for 2 hrs. Please what ever you do - do not ever fly Ryanair as it is not worth the couple of 20-100\342\202\254 you save from flying with Norwegian or SAS or just any other airline.
## 182 Absolutely horrendous service. Very limited information throughout on a flight that was delayed over 3 hours and landed in Birmingham at 2.30am instead of landing in Manchester at 23.10 as it was supposed to. We had to wait inside the plane for 1h before take off and over an hour after landing. Shockingly bad service. I\342\200\231m very unlikely to ever fly with this airline again
## 183 This review relates to a Ryanair Flight from London Stansted to Rimini in Italy on 26th July 2022. Firstly, the website is logical and well set out stating the rules and policies of the airline. Follow the rules and there are no problems. I should like to commend the Check-in staff for their help and efficiency. I took a train from London to the Stansted airport unfortunately the luggage of another passenger ripped the top of my bag. The check-in staff noticed this rip and were very helpful towards me. Boarding the flight was another matter as there was a rather large group of Italian teenagers returning home to Italy. Their chaperones were badly organised and the Ryanair ground staff did not manage this well resulting in a delay to the flight of about forty minutes. None of the ground staff showed any initiative in this situation. None of the ground staff spoke any Italian and there was no effort to translate to the teenagers. Passengers were allowed to queue in the bridge before the flight was ready to depart. There were steep stairs to be negotiated and I assisted an elderly passenger with the stairs as no warning had been given about the stairs. The security demonstration was reasonably well conducted. Service was lacklustre with one cabin crew yawning over her passengers and rolling her eyes and looked bored. The lovely lady who sat next to me ordered a prosecco and was gruffly handed her drink and a cracked plastic glass. The drink spilled over the lady and the male cabin crew showed no interest and seemed to expect the passenger to continue drinking from the cracked plastic glass. The male staff member had to be asked to find some paper towels and to replace the glass. He sighed indignantly when asked to do so. At one stage a member of the cabin crew locked the lavatory and caused a line to form. There was no apology or explanation either. The landing was fine but disembarkation was chaotic and poorly managed. Based on this experience, I would think twice about booking with this airline again. The ground staff were superb, friendly and polite and very helpful. Their professionalism was let down by the cabin crew.
## 184 I feel very grateful to Ryanair because on 07/22/22 my wife and my two children traveled to Barcelona, on the trip before landing my wife got very sick and all the staff helped her, but the most nice thing I experienced was that a stewardess took care of my two children in the hospital while my wife was waiting for medical attention. Thank you Martha for taking care of my little ones, for me Ryanair is the best
## 185 Arrived at the airport after a busy couple of days. Didn\342\200\231t have time to check-in online as we tried doing it but you had to go through multiple different steps that if you\342\200\231re not tech savvy don\342\200\231t make a lot of sense. We were shocked to find out that to get our boarding passes you had to pay 55euros each to receive a hand written paper boarding pass with your name and info. We booked together and were not seated next to each other. Then when we asked if we could sit next to each other they tried to charge us an additional fee. To top it all off, after running around to different desks and getting handwritten boarding passes, we then found out that one of us allegedly hadn\342\200\231t paid for a 20kg cabin bag, when both of our receipts showed that we had. They refused to believe that we both had and made us pay 50euros again for a bag that we had already paid for. We will never fly this airline again, absolutely shocking morals, unsure whether it was a customer service thing or whether they were just following their company policy but there was no remorse from the staff.
## 186 Overall the flight was pleasant and quick. However I found the seats unpleasant and a distinct lack of legroom, although not unbearable it was rather uncomfortable.
## 187 I found Ryanair to be responsible and pleasant. The crew were able to assist where needed, the legroom was sufficient and the food and beverages available were of a good quality. However I did find the seats a little uncomfortable and the plane felt rather old and dirty.
## 188 Late on the way out 10 days ago and late return also. Stuck in a sealed up plane for a long time before take off. Due to depart at 9.50, departed after 12 midnight. I was sitting in row 9 and by the time service came to me they had no soft drinks left and had also run put of water! They had no milk on the outbound flight for hot drinks. Paid a lot of money for these flights and was late both ways. The plane coming back was so hot and uncomfortable and nothing to rehydrate for many passengers either as I got the last bottle of water 20 passengers into service. No paper in the toilet and a surly and jaded looking set of flight attendants. Landed at 2.05 am and had a long wait for baggage also. Didn't actually get out of the airport til after 3am. We had to book priority boarding if we wanted to bring 10kg carry on bags and guess what, everyone was released and boarded all at the same time in a herd like way. That to me feels like fraudulent sale. In a nutshell its been a long time since I flew with Ryanair and hopefully it'll be a very long time before I have to endure them again. If I had paid for cheap flights I'd shut up, but I didn't.
## 189 I had the worst experience with Ryanair customer service. As I was travelling with a six month old daughter, I paid for speedy boarding at Prague airport. The boarding process was a complete chaos, there was no call for speedy boarding customers and eventually we were made to wait in front of the plane in one large queue, holding the baby in my arms in the cold, and I was literally the last person to enter the plane. I complained to the staff on board and they were very apologetic and advised me to request a refund online. I have filed for a refund for the speedy boarding service, waited 4 months for a reply and when it came, it simply read as for our conditions we do not offer refunds. Well thank you for letting me pay for a service I never received.
## 190 Booked a 3 flights trip. London Luton - Naples - Malta- Luton. Every single flight delayed by at least 1 hour. This is the worst airline. We booked because it was cheap and we only needed hand luggage but due to delays we actually paid more to car transfers etc and car hire companies as we either missed the pick up time or collection. Ryanair are just so bad. Cabin crew are rude. They just don't care. Seats uncomfortable.
## 191 My flight on 1/7/22 from Lisbon to Luxembourg was canceled while we were already on board. After disembarking the crew told us to go to the help center to rearrange our flight. I asked where our luggage was and they had no idea and they were completely lost. I waited from 19.00 until 1.00am the next day to be served by the customer's service desk to tell me that the next flight was available in 5 days, they don't pay for accommodation (not either for the day of the cancellation where I was at the airport until 01.00 am) or any other reimbursement. I asked them to give me what they offer in writing as proof from my employer as long as to request a reimbursement from the insurance company. I had bought insurance coverage through Ryanair's application. They refused to give me what I asked and they gave me a paper with the links to request a refund in case I didn't want to fly in 5 days and to open a request to Ryanair's help center to provide me the evidence of the cancellation and the alternative options they offered me. I also asked why they didn't give us the paper while we were waiting for so many hours in the queue to read our rights and decide without waiting for so long, and they replied "we don't know". I paid for the hotels and I opened a ticket on 2/7/22. Until today 15/7/22 I have not received any feedback although I sent two reminders telling them that I have to provide the requested docs to my employer and to the insurance company. The plane crew, the ground service, and the help desk were completely unable to manage the situation.
## 192 Every time I've travelled with Ryanair something unexpected happens and I always end up paying for something that I imagine was included in the ticket that I have already purchased, because the info given is so minimal. It's almost as if they don't tell you the information so that you pay more when you reach the gate. I booked an around trip and on my departure to Corfu and my bags went through the system smoothly and without any concern, but then on my flight back home, with the same exact priority that I had on my first departure they tell me that my bag is too big and I have to pay extra for it. The girl at the check-in did not say anything about me having to pay even extra at the gate, and I was not the only one that went through this process. Not only did I have to pay extra, the Ryanair personnel at the gate were very rude and gave me and others attitude. And to top it off, the flight was just as expected by me, late. We had to stand outside for 40 minutes while the large jets were testing their engines. I could go on but I won't. All in all a very disappointing experience. The "cheap" flight ticket ended up costing as much as what a decent flight company would charge.
## 193 Worst airline ever. Rude and disrespectful staff. Definitely the biggest fraud company they try to take your money in any possible way. Always late never on time. They give you completely misleading information about whats your right as a passenger and then use it against you. Will never fly with them ever again.
## 194 I've had some unforeseen events with Ryanair, very complicated even. But today I come here to say that I really enjoyed checking my luggage with Ryanair, the lady was super kind and cordial to me. So today I want to say that I was very happy to fly with you. J\303\241 tive alguns imprevistos com a Ryanair, muito complicados at\303\251. Mas hoje venho aqui para dizer que gostei muito de despachar a minha bagagem com a Ryanair , a senhora foi super amavel e cordial comigo. Por isso hoje quero dizer que fiquei muito feliz em voar com voc\303\252s.
## 195 Even bearing in mind that this is a low cost airline, there are things that should not be tolerated. The agents at check-in counters were outright abusive. One of them, looked at my passport, saw Ukrainian nationality in it and asked for a Covid test. I was fully vaccinated and at this time the requirements on Ryanair website was either full vaccination or a test. I showed all my proofs of vaccination and a self-test, but she kept demanding that I do a test at the airport worth GBP 40. I pointed out the requirements on the website were different and then she said \342\200\234one more comment and you are not flying\342\200\235. I took the test, spent money and 90 minutes waiting for the results, and returned to the check-in. By then there was another agent at the counter, she said I didn\342\200\231t need the test and proof of full vaccination would do. I returned to speak to the first staff member, but she yelled at me in front of other customers calling me rude and saying that she refuses to \342\200\234serve me\342\200\235 in any circumstances. I contacted Ryanair multiple times after, bringing this situation to their attention, they did not answer. My experience with Ryanair this February was appalling, and I recommend to avoid flying with this airline at all costs.
## 196 Really upset about the flights cancelled. We, a group of 4 people, have booked the flights from Ryanair from Bucharest to Edinburgh July 27 - August 3 2022 and they were cancelled. We couldn\342\200\231t find another proper slot therefore we asked for our money back. It takes too much time to receive them back. We were forced to changed the flights, we didn\342\200\231t find the same dates and now we need to pay another night of accommodation of 280 EUR for 4 persons due to their cancellation. Will never choose Ryanair again!
## 197 Ryanair is absolutely the worst airline I have ever flown. They up charge for everything. Upon arrival at the airport they wanted me to pay an additional "musical instrument" fee for my guitar after I had already paid an additional fee to carry it on the plane. We explained this fact, but were treated horribly by the service desk, and made to either buy a separate seat on the plane for my guitar or pay this additional fee. They claimed that the case would not fit in the overhead bins, but it clearly would. They also booked off-site Parking and upon our return from the trip, the parking attendant did not show up at in the airport to pick us us and was unreachable by phone after 4 attempts. We ended up having to take a Bolt car over to the parking lot and were then verbally attacked by the parking attendant who was angry that we used WhatsApp to call him instead of regular phone line to reach him. No apology for our difficulty in reaching, said "we made a mistake" when clearly they had not showed up as stated in their instructions.
## 198 I was travelling from Genoa to Vienna, and I bought the ticket one night before with the luggage included. I didn\342\200\231t know the small one is included just for the Priority that I will know in the future, but at boarding they say they will cancel me if I don\342\200\231t pay in 1 minute for the small luggage. I was waiting my phone to get connected so I can use the bank, because cash they didn\342\200\231t want to take. I am very disappointed of the Ryanair staff at Genoa.
## 199 On 4 April I flew from Tel Aviv airport to Budapest on Ryanair flight FR6755. The last time I saw my suitcase was at the luggage belt of the Ryanair check in desk at Tel Aviv airport. When my suitcase did not arrive at Budapest airport, I filed a property irregularity report. Up to this day - June 2022 - my suitcase has not been found. My emails remain unanswered and calling is useless as the employees can only tell you to write (another) email.
## 200 The worst airline I have ever tried. The tickets are cheap at the time of buying. However, I had to pay $128 for check in at airport for me and my wife. There is no personal from Ryanair at airport to talk to. There is no customer service. I would never try to buy ticket from Ryanair.
## 201 The flight itself was uneventful apart from feeling even more cramped (row 31) than normal and running 20 minutes late but my rollator/walker did not arrive at Faro. On going to the Ryanair desk at Faro the staff could not have been more helpful in making numerous calls to try to locate it but Leeds Airport were not answering the phone. With many apologies we were advised to go home and await information from them. After 3 days with numerous calls saying they could not get a response from Leeds we got a call from Fiona of Ryanair in Dublin to say they realised how important my rollator was for me and, if I could supply details of model and supplier they would supply a new one. This I did and today a brand new one, fully assembled as requested, was delivered to our home by a friendly, smart Ryanair employee. One could not have wished for better, more helpful and efficient treatment.
## 202 Boarding was done without an air bridge but it is a budget airline after all. The seat did not recline nor have a moveable head rest. There were no complimentary meals, drinks or snacks. The crew looked life-less and didn't show any form of emotion. The aircraft was semi-clean.
## 203 The worst airline ever! The flights are always delayed and they have most ridiculous excuses for it. Last time we spent 6 hours in the airport from departure due to delays and we've been given 4 euro vouchers to spend on food, although, the sandwiches in the caf\303\251 cost more than that. I would avoid flying with them.
## 204 I have flown with this company 3 times for 3 different destinations, and, every time the flight was delayed, last week, for example, it took off 1.5 hours later than it should have. Same on both ways. They earn much money from this delay policy and people shouldn't accept it. They ruin your connections and they ruin you plans for vacation! I will not fly with Ryanair anymore!
## 205 After Ryanair had cancelled my flight to Prague just 1 day before the flight, I was forced to place another booking for over \302\243340 to make sure I was able to travel, I couldn't take the risk. After the trip I'd spoken with an agent and they agreed to process a refund excluding the extra for booking through a third party. They lso advised that I would receive my refund within 1 week. I chased this up another 5 times throughout April, May & June. Every time, the agents said it was a processing error & the money would be paid within the next week and it never was. When I requested a confirmation email, each agent has told me this is not possible. After speaking to an agent today (we are now in July), the agent has again confirmed that Ryanair will be processing the booking fee and nothing else. After speaking with an agent on the phone today; I have been advised that I will receive a confirmation email that my refund has been processed, something I have been denied before. The agent also advised me that payment may take up to 28 days. This is another 28 days on top of the 60+ days since Ryanair advised that I would receive my payment in the next week. This has to be the worst customer service in business.
## 206 Ryanair is the worst airline ever, I do not even recommend this to my biggest enemies. We were supposed to fly at 8.35 to Marseille. We got through security and we waited for the gate to open. But suddenly our flight info disappeared from the display, it said that there is no gate open for it. After 10 min. they tell us that the flight has been cancelled and that we must leave the airport immediately. They didn't give us any reason or any compensation for it. They destroyed our family vacation. So now we can't do anything about it and we must accept that Ryanair won't get us there. After a few hours, we were told that the plane just didn't arrive. When we tried to get a refund for the tickets, they told us they will give us only one ticket, because the flight back technically didn't get cancelled so they won't give us the money back. With that said, the lesson learn is to never fly with companies like Ryanair!
## 207 Don\342\200\231t be fooled by the affordable prices. You will end up paying way more than expected. They charge $30 Euros to check you in and print your boarding passes, they charge a lot if your bag is overweight. They allow carry on bags but they must be super small in size. If you are traveling from the US and the carry on is a good size for other airline standards, it will be too big for this airline, therefore you will need to send it as a checked bag for an extra price. They have so many ways of making you pay a lot at last minute at the airport. Will never fly with Ryanair again.
## 208 This rating is for a flight from last year that was cancelled shortly before the date and the only possibility was to book another flight with other company so that we can fly back to Brussels. I was assured that all costs will be paid back. Now after 1 year I am still waiting for a decision if they are going to refund the money. To be fair the craft is mostly friendly and for a cheap flight you can't put high expectations and start to complain.
## 209 Outbound and inbound flights both were delayed, but this is not always the fault of the airline. Staff in general friendly and both planes were acceptable clean. We booked extra legroom seats upfront, which is recommendable and worth the extra money for 4h+ flights. Food and drinks on board more then ok at acceptable prices. Again I cannot fault Ryanair on these flights which were of great value!
## 210 I spent about an hour trying to check in on line the day before departure but it wouldn't work. I contacted customer services via on line chat and was ultimately told I could check in at the airport for free. When I arrived at the airport I was met with an unbelievably rude and aggressive woman who wasn't interested in my issue and wouldn't even read the screenshot I had of the conversation. She simply said she didn't have a record so that was that! Totally unnecessary, it's difficult to understand why any company would treat its customers so appallingly without due cause.
## 211 My husband bought a round-trip ticket Tel Aviv-Berlin. At the beginning, the flight was delayed for several hours, and then, instead of Berlin, the plane landed at 2 AM in Hannover. Then a fabulous show began: the pilot, upon landing, announced that the passengers had nothing to worry about and a bus to Berlin would be organized. As a result, the passengers were denied a bus to Berlin / hotel - they were abandoned late at night at the airport in other city at a time when public transport does not work. In addition, passengers flying with luggage were left without it, as the luggage was sent to Berlin. And now Ryanair sent me an "Apology for the flight delay". No, Ryanair, we don't accept your apologies for the "flight delay". This is not the provision of the declared services we paid, which caused a significant financial and moral damage.
## 212 This airline is a total farce. If I could give it a negative one I would. They put us on a the plane knowing we would have weather delays and we sat on the tarmac without any service. I will never fly Ryanair again. I am fine spending a little extra money to get some logic.
## 213 Firstly, as a member of staff at the airport I must say, I hear alot of bad things about Ryanair but let me tell you as someone who meets many passengers and works close to the action, my knowledge about Ryanair at Manchester Airport is huge. There isn't much room for a person who is overweight in 1 of Ryanair seats, they'll probably be uncomfortable for the whole flight, especially next to the window. Ryanair use Terminal 3. It's a no smoking terminal. Ryanair quote, "low fares", but they mean the starting price is a low fare. It soon adds up to cost just as much as easyjet or jet2. When you board or come off a Ryanair flight you'll find it's always up/down the steps not through the airbridge. When you're waiting for your suitcase. Expect to be waiting for at least 1 hour and 30 mins. Otherwise you might loose your mind and take it out on the wrong member of staff....like me. On our way home from Rome we arrived at the airport, got through security. I decided to check my phone to see where the plane was using Plane Finder. The answer to my question....Manchester. It had literally just taken off. We left nearly an hour late. During the flight we were told no food or drink available. Imagine if we purchased an inflight meal. We arrived at Manchester but spent 3 hours waiting for our bags because Swissport must've only had 3 people unloading each Ryanair flight. So we were 1 of 3 flights landed. For 3 planes there is a maximum of 3 baggage handlers. I know this because the baggage handler told me. I decided to ask him what abuse he was getting from a passenger who landed with me that day. Good luck if you book Ryanair.
## 214 Worst customer service ever, they cancelled my flight 5 weeks before our holiday. Despite trying to get a refund or book new flights through their website, and getting nowhere. Plus customer service were absolutely useless, telling me I had to do it through the customer booking website! I gave up after 3 weeks of trying and just booked new flights at double the cost of original flights. We are home 3 weeks and still trying to get a refund. Absolutely shocking. Never again. Better to pay a little extra and fly with a reputable airline, get decent comfortable seats and not ripped off either by overpriced food and drink. Cabin crew require new uniforms! I have never seen such an untidy lot.
## 215 Alicante to Paris. We flew to Paris from Alicante, Spain. The flight was 2h delayed! No information was provided on the company's website, according to the data on the internet, the flight was supposed to depart on time. I was trying to reach the customer support service and call them, but no one picked up the phone! At the airport, there was no one at the Ryanair desk to help it just was empty. When we eventually got onboard, the pilot announced that the reason for the delay was that they simply did not have a plane for the flight and they waited for it to arrive from somewhere else! Moreover, when we got onboard the seats were dirty because they did not have enough time to clean them after the previous flight. On top of that, our return flight was also delayed. So unprofessional!
## 216 Apart from horrendous queues at Birmingham (not Ryanair's fault), flights both ways (operated by Malta Air, a subsidiary of Ryanair) were excellent. Ground staff and flight attendants were friendly and helpful. The planes were clean and our seats (we paid a bit extra for exit seats) were roomy. We do not normally buy food on board, but as the return was a lunchtime flight, we bought a sandwich and drink, which were, respectively, hot and cold and were very reasonably priced. Flights both ways were more or less on time. I see the less positive comments from other travellers, but I have flown Ryanair many times and the rules are clear - as long as you follow them, you shouldn't receive any nasty surprises.
## 217 When you consider all the extra fees this airline is not value for money at all. From now I will avoid this airline at all costs and recommend everyone to do the same. Their customer service is the opposite of what customer service should be. If you do not wish to pay an extra fee for check-in, you need to do it online 24 hours before the flight. However if you try to do it 2 hours before the flight, it is already closed and you need to check in at the airport and pay an extra fee of 55 Euros per person at the counter. Forcing customers to pay extra fees that are higher than the actual ticket! For a service that takes their employee 2 minutes. That's down right scammy in my opinion. We didn't even get seats next to each other even though we paid that fee. I had the same on another flight when checking in online, unless you pay extra online, you will be systematically assigned random seats not next to each other. The seat my partner had had a free seat next to her, still I was seated somewhere else because I didn't pay extra.
## 218 Flew from Aberdeen to Faro Checking in good and flew on timeService not good as food and drink came from the back of the plane and went straight to the front of the plane missing our party row 39 and then came back to the rear of the plane, so not a good choice to pick. from Landed on time Had to walk of the plane to get onto airport, good job it was sunny. No person to show where to check in. Booked transport from Faro to Albufeira via Ryanair good transport. Home trip Got a email from Ryanair to get to Faro 1 hour early then planed 4AM to 5Am. Transport did not arrive for 4AM so we had to pay for a taxi, could not trust the transport would arrive, so paid 60 Euro to get to airport. We called and emailed about the transportation not arriving. No call no email asking if we made the trip to airport.
## 219 From start to finish bad in every way. The only point ok was finding the flight and paying. After that all a nightmare, and in the end probably more expensive than a premium airline and have everything good. It spoilt the run up to my trip and felt like I just wanted to cancel everything. I needed a rest after the experience with Ryanair. Getting home I don't want to even think about it again - but long delays then left after midnight to try to get home the next day and all night in the cold etc. I have flown with Ryanair before and it's wasn't great then either. I'll look for other airlines next time, and recommend others do the same.
## 220 Upon queuing at the gate, one of the check-in staff started making her rounds handing out pieces of paper and asking questions to passengers. She made a b-line towards my mum and I and out of the blue said our bags had to go in the hold. For a second I couldn't believe it. These are the same bags and same size and weight we used going up from Malta. So much so that I am thorough with travelling light and my mother's bag in particular is a Ryanair approved sized wheelie bag. To prove a point the lady at the check in placed it in the sizer which fit perfectly only to tell us that it's above the line! I thought to myself this is a joke. In the meantime a quarter of the other passengers in the non prio line had bulky rucksacks twice the size of our bags which would have never fit in the sizer. I paid the 90 odd euros for this thieving act and vow to never use Ryanair again. This airline bends and manipulates the rules to suit them and they change from airport to airport and staff to staff. I can handle everything else but I cannot accept manipulation of rules and conditions. My concern is these handlers are giving Ryanair a worse name.
## 221 Horrible staff. They looked at my shoulder bag and based on what they thought, they charged me 20 pound extra. You feel the greed for money in their eyes.
## 222 Manchester to Torp which was booked with airport counter check-in included, the \302\253Plus\302\273 ticket option. Hence, it should be safe to assume that the counter check in is available and working. We arrived nearly 2 hours before departure and spent 1,5 hour in a queue waiting to be checked in together with lots of other people. 2 counters only were open, which obviously was insufficient. We asked a Ryanair representative if it was possible to speed up the process, but she was only interested in lecturing us and questioning why we had not used the net check in, rather than doing something to speed things up so people didn\302\264t lose their flight. She might well be right that this is a better option but in our situation that is totally beyond the point. No actions taken, nothing done, just a shrug. We managed just about to arrive gate on last and final call just to be stuck in an unventilated corridor with all the other passengers for 25 minutes before boarding started. The flight itself was what we expect from Ryanair; it works and gets you there. Crew was smiling and positive. Hence 2 stars, not 1. Ryanair has a considerable attitude problem. I won\302\264t be back unless there is no other option.
## 223 Boarded all passengers, closed doors then sat on tarmac for over 45 minutes before departure in unbearably hot cabin. Air con not working. Passengers frightened, angry, panicking and distressed. Some begging to be let off. No information from pilot and no PA from cabin crew about the situation. Eventually the front door was re-opened and passengers with babies that looked very unwell due to unbearable heat were taken to front for air. Aircraft pushed back from stand and further delays before engines started and air began to work. Anyone asking for water was charged for it. Shocking, unacceptable and dangerous disregard for customer experience and health.
## 224 This flight was the worst experience I\342\200\231ve ever had. Our flight was already delayed for 2 hours from 6:30 to 8:30 pm. Although that didn\342\200\231t happen and we were waiting for the plane till 9pm. We got to the plane around 9:20 pm and they informed us that due to the bad weather we need to wait more. After half an hour they said they\342\200\231ll depart in 1 hour. They didn\342\200\231t let us off the plane either. So basically we didn\342\200\231t have any choice but being prisoned in the plane until the weather is ok. When that will be? Unbelievable how unorganized and awful their service is. Zero respect for customers and their time.
## 225 After many many flights and studiously avoiding Ryanair I decided to give them a go,I usually travel to Luton to fly to Faro but with Luton Airport a nightmare I decided to go with Ryanair from my local airport Birmingham. I must admit I was very pleasantly surprised check in at Birmingham and Faro took minutes and both flights were on time, in fact on return journey we arrived 15 minutes early. All Ryanair staff we dealt with were polite and helpful, couldn\342\200\231t fault them at all so will certainly use them again. Only reason I don\342\200\231t award full marks was because on the outward flight cabin crew made toilets at the front of the plane for crew only so everyone had to use the back and with the catering trolleys in the aisle for most of the flight it made for some very uncomfortable passengers, no such problem on the return flight.
## 226 Leeds to Majorca. My experience was absolutely horrendous. We paid for fast track from Leeds - Majorca - Valencia - Majorca - Leeds. This was a waste of money as we stood in line which was slower than the normal queue at Leeds Airport. On our way back from Majorca we were seated in the waiting area and approached by one of the staff who demanded to see our boarding pass. We showed her the boarding pass and she immediately demanded that we follow her to the desk. She told my nephew that he had a non-priority ticket and said "I need your credit card." When he asked why, she said he had another case and needed to pay \302\24345 now or else he could not fly. She and her colleague seemed to feel proud of the way she had put us on display embarrassing us in front of everyone else who had now lined up behind us. We were being stared at angrily as it seemed we were holding up the queue. I thought I had paid for priority tickets as I paid for fast track and selected seats. I showed them the icon on my Ryanair account after logging in and the responded saying they didn't know what that was. They had to call someone on the phone as my nephew who is American provided an Amex card. They kept us at the desk in front of everyone who thought we were holding up the queue for more than 10 minutes. I asked and they wouldn't give me any more information. Eventually, my nephew got his passport and his boarding pass back and they started embarking. They asked us to wait even though I had paid for fast track and we were already at the front of the queue. They deliberately kept us there and let us board after I became upset. When we boarded we were confronted by the flight attendant who told us that the cabin bag we had just paid for needed to be in the cargo bay even though it's smaller than normal cabin cases. I advised them we had paid and pointed at the tag which was snow taped to the bag and she insisted that we should have been told to put in cargo. I tried to explain that they didn't tell us and we wouldn't know that as we don't work for the airline. She put her hands up in my face cutting me off and stating that its the airport and not the airline and she doesn't work for the airport. I advised that we don't work for the airport either. She agreed for us to have our case in the overhead compartment but stated that should it fill up, it would need to go in the cargo area. We watched as cases bigger and heavier than my nephews were placed in the overhead compartment with no argument. I have never been so embarrassed as I have with Ryanair and will never fly using Ryanair ever again. I will tell anyone who will listen to what happened and never fly Ryanair again. I will happily pay more money to fly with a company with a better reputation. We were deliberately put on display and embarrassed and that is very wrong to do.
## 227 I've tried to avoid Ryanair for years after some negative experiences. (Extremely annoying announcements, and disruptive stag-party passengers dressed as superheroes spring to mind.) But my recent flights (Stansted-Lamezia; Malpensa-Stansted) were absolutely fine. I was particularly impressed by how polite and helpful the ground staff were at Stansted, and the onboard crew were fine on the way out, too. I was flying solo and paid for extra legroom etc, which is probably wise if you are not on a tight budget.
## 228 I have to say this airline is the equivalent to hillbilly buses you see in southern parts of the U.S. They are forever late, customer service is a foreign idea to them. Utter incompetence in handling aircraft\342\200\231s! I haven\342\200\231t flown with them in a year but said I\342\200\231d give them a go this time. Big mistake, never again!
## 229 The second time happened to have a bad experience with Ryanair in Thessaloniki Airport. The boarding staff asked me to prove to her my settled status in UK. So, I am in Greece, an EU national, being asked to prove my settled status in the UK. I provide the woman with my code and letter from HMRC showing I have settled status in the UK, and she was not able to use the data provided as she does not know it, and because she needs a database of UK government in order to check my settled status. Finally, my husband logged in the UK Government account and showed my name, this happening after all people left to the plane, and we remained the last ones.
## 230 Boarding experience for elderly people with mobility issues and medical assistance is awful. Priority boarding is meaningless and the big strong or pushy people just push older or frail people out of the way. The process of providing medical waiver letters a day before departure is also very stressful as this leaves no leeway for if there are issues and people may not be able to print these letters if they find digital technology difficult. Staff should help people with medical needs to board early and assist them on the plane. Also staff allowed groups of men to remove their masks on the plane putting everyone at risk. There are much better budget options.
## 231 Do not fly Ryanair if you have children! Their website states you are allowed a carry on baby changing bag - yet staff wanted to put my baby\342\200\231s milk / nappies etc in the hold. I also paid priority boarding to allow me to take on my fold up buggy into the cabin but I was refused this and threatened to be thrown off the flight. My changing bag and buggy were both within restrictions given on Ryanair\342\200\231s website. Not only that, but when I disputed this, the air crew then refused to serve myself, my 10 month old baby, 2 year old and 3 year old for the entire 4 hour flight. They would not even take our rubbish. I was flying solo with my 3 children and they made our experience so stressful. They are unhelpful, with no understanding or compassion for their passengers. Other passengers were also saying how ridiculous it was given that I had paid for the baggage and I was flying solo. It was my first experience with Ryanair, and my last.
## 232 I tried to place booking at 23.03.2022 via ryanair iOS app but got error on payment step, then returned to main screen. After few seconds I was billed and I decide that it was mistake and wait that this withdrawal will cancel. But it was not happened. Than, i try to place booking again and it was success. I ask my bank about first withdrawal, why it was not canceled and they ask me to contact with Ryanair support. I did this and it turned out that in fact in the first case the reservation was placed! But not any information about it. So I have two identical reservation and ask to refund one of them. Now passed almost two weeks and it still not refunded. I have to spend a lot of time to contact with support and so on. So when you bill me - it is few seconds but to got refund i have to wait weeks.
## 233 Terrible customer service and non-existent communication As a US resident, I had the bad experience of being stuck in isolation in Italy because of covid. As a consequence, I was unable to make it for my Ryanair flights within Italy. I tried to reach out to the company several time to inform them about my situation. After several attempts using some kind of useless robot on their website and talking to representatives on the phone, they don't seem to have or want to put in place any customer-friendly measures in this already stressful situation. I felt totally helpless and I am socked by how they dealt with the situation. I would recommend you use low-cost airlines other than Ryanair for your next trips.
## 234 I bought a 10 kg roll on hand luggage for 24.50\342\202\254 for both outward and return journeys, when I booked my flights, but hours before leaving I checked my app to see that I was only allowed one small bag and if I brought another bag to the gate I would be charged 69\342\202\254! Rather than facing a showdown at the gate in the early hours of the morning, I chose not to fly.
## 235 Plane is very dirty and some of the staff aren't friendly. They make up rules as you go. We weren't allowed to put our backpacks in the overhead storage bins due to corona but it's fine for hand suitcases to go in there and to sit in a seat that's dirty with dirty marks on the window and the side of the window. We had a return flight and sat in the same plane going to Italy and back again to Finland.. Same dirt as when we flew the first time. There's also no space for you to put your dirt in the front seat and the trays are at a angle that whatever you put on there slides down and the seats are so upright you can't sleep.
## 236 The last time I am ever going to fly with them. When arriving at the airport for check in, there was only one member of staff on the relevant desks and so a lengthy wait was needed before we got to speak to them. By the time we did speak with them, she informed us that we had just missed the check in period and each ticket was now to be charged \302\24355 in order to check in. The total of \302\243110 was as expensive as the actual flight tickets, if not more. The late check in was primarily due to the understaffing at the Ryanair counter at Stansted and not to any poor time keeping or organisation on our part. After reluctantly paying this extortionate fee (what other choice did we have?), we then proceeded through security and on to our gate. Once we boarded the plane however, there was than a 1 hr 45 min delay to our flight where we sat on the tarmac and waited. Having been charged \302\243110 just moments earlier for being late and then being delayed for almost 2 hours really angered me. The late check in fee was entirely unnecessary and immensely overpriced in the first place, but what with our flight being delayed, it then also proved to be completely redundant. It seems that I was deemed late and charged, but they can be four or five times as late as I was deemed to be and get away with it.
## 237 We were travelling with our 1yr old baby. We could not check-in online for some reason. We arrived at the airport 2h10 before but time to queue (very long queue) we arrive at the desk 1h30 before the flight and then we had to pay 110 euros for manual check-in (for what is this 55 euros fees I don't know but does not seems fair). Then we queue (again very long queue at the security check-in) and we run to get to the gate. There someone says we only have a FFP2 masks and need a FFP3 mask. Anyway we just want to get on the flight so we go to buy some FFP3 masks at the nearby shop (which actually are FFP2 but much more thick). We are then allowed to enter the flight and noticed that all of the Ryanair employees on board have a simple mask (same as we had before we were refused). Flight was okay even though the seats are really uncomfortable. Thank god it was only 1h30 flight. Anyway last time I fly with them. I prefer to pay 300 euros more and not have to go through all this.
## 238 My wife, myself and our three daughters age 3,5&9 flying back to uk from Faro. My youngest daughter had an accident in the departure lounge and we ended up missing the 20 minute deadline to board the plane by 3 mins. The irony being we\342\200\231d been sat in the departure lounge waiting for the flight to board for over 30 mins. There was no way they would let us on the plane and they ceremoniously told us this in front of 300 people flying on the adjacent flight. My wife and eldest daughter in tears. My youngest not sure what\342\200\231s going on. All in all 10 hours later we got back to the UK, Stansted instead of Birmingham. We hired a car at 1am in the morning and drove home to Gloucestershire. I drove to collect my car from Birmingham airport the next day. \302\243900 mistake overall. Ryanair charged us \302\243500 of that just to adjust the 5 tickets regardless of age. The one saving grace was the good will of the passengers that moved their seats to help us sit together. My distain for this airline can only be described in words I can\342\200\231t possibly write in this review.
## 239 Regular Ryanair customer. Flew back from Alicante on Friday 18 th March 2022 into Shannon. Perfect flight and landed 15 minutes early. But wanted to commend a few things. The cabin crew were excellent, very professional. The landing was so smooth I didn\342\200\231t realise we where on the ground. But I do wish to single out the senior flight attendant. I was carrying some duty free as well as my 10 kg case which was heavy. The steps off the plane were steep which normally I\342\200\231ll cope with. But I asked this young man if I could leave my case till I get down the steps and then come back up and get it. Not at all he said I\342\200\231ll take down for you. He was a gentleman. I thanked him and he said it was his pleasure. One final thought it was the first time I heard senior cabin crew thank his colleagues for their help and hard work during flight. Nice touch I thought. I know this man was not Irish but thanked the passengers for flying Ryanair in Irish. Excellent. To be commended. Well done Ryanair customer service.
## 240 This was the first time I have flown with Ryanair for years, after previous bad experiences, and I only flew as it was part of a package deal. It\342\200\231s not that much cheaper than other airlines, which would give a better experience. The boarding process was the worst I have ever experienced. We were second in the priority queue and ended up, passing through the gate and waiting at the bottom steps waiting for a bus for ages, then we were one of the first to board the bus. We then had to wait on the bus at the bottom of the aircraft for ages, and when we got off the bus, surprise surprise we were now much further from the front. This is Ryanair priority boarding. Pretty much everyone on the flight had priority boarding, but it only gets you priority onto the bus. This is not really priority. The staff were very good, the food offerings were poor, and the seat is bolt upright, with no adjustment, and no storage. The seat is only really suitable for an hour or two flight, not four hour\342\200\231s. We were at the furthest possible gate in Tenerife, and arrived into the furthest possible gate in Dublin. This is typical of Ryanair. The ultimate in no frills.
## 241 Worst customer service experience I have ever had. We arrived an hour and a half before departure and went to check in. Ryanair only had two employees. One member of my company and I were denied our COVID certification due to a difference in Italian rules we were unaware of, which was fair, except we were leaving the country to go to the UK where we were in line with the rules. Regardless the staff sent us to the basement to buy a COVID rapid test. Within 20 minutes we were upstairs again with our results, but the two employees had closed the check in counter, after they had told us to run downstairs to get a test and then come back for our boarding passes. We couldn\342\200\231t get our passes online because it directed us to the ticket counter, but the ticket counter had stranded us. The rest of our party had headed through security while we got our tests and approached the Ryanair staff on that side and told them our dilemma. They told us to obtain our boarding passes online, which we couldn\342\200\231t do because it directed us to the ticket counter. They told us we had to book new flights because no one was at the check in counter. We were early enough we would have made the flight had someone been at the check in counter to simply print our passes (as we had checked in online). Our party members talking with the employees at the gate talked with them for 50 minutes trying to get them to send someone to log in but they refused. During that conversation we informed the Ryanair representatives that one of the stranded members was prone to seizures and was out of their medication (which was in England. They simply hadn\342\200\231t brought extra) and needed to be on the flight to get her medication. The staff was unresponsive, with the manager also refusing to get our passes and when told about the seizure situation was told that if they seized \342\200\234we would have to take them to a hospital\342\200\235. After no help those of us that were stranded found a hotel and arrived there before the flight took of, as it departed 50 minutes after the scheduled departure time. Absolutely the worst experience. We will never fly Ryanair again.
## 242 Manchester to Kerry, flight left on time and arrived a few minutes early. Uneventful, cabin crew friendly enough. On the return leg the incoming flight was delayed by a huge storm so we were delayed departing. It was a very bumpy flight due to the extremely high winds. The captain performed a minor miracle in landing the plane at Manchester on the first attempt in what can only be described as extremely challenging conditions.
## 243 Worst experience. So many hidden fees. Had to pay expensive fines for problems that was not my mistake. Rude staff and not comfortable flight.
## 244 Ryanair puts profits above people. I have over half the symptoms of covid, contacted them to try and cancel my flight and they told me there are no refunds under any circumstances. They want me to fly today and potentially infect other people so they don't have to refund me $165. This company, worth almost 26 billion dollars, wants me to fly today potentially with covid so they don't have to refund me.
## 245 Beware of the latest scam - 3rd party services booked on the Ryanair website: I was flying from London to Malaga and, when I purchased extra hold luggage the day before I flew, I decided to, at the same time, also buy a ticket for National Express from Victoria coach station to Stansted airport. I did so and paid one amount on my credit card, but I received no confirmation of the National Express booking, so I called NE and they had no record of my booking or payment. I did so again the next morning - still no record, so I had to buy the ticket again at a higher price. I tried to call Ryanair, but could not get through to them, nor had any success with their "live" chat. After arriving in Malaga I tried to get a refund from Ryanair, whom I had paid, but they said that I needed to get this from NE and that it had nothing to do with them as NE were a third party service provider. All my explanations that I had paid Ryanair and NOT NE were ignored. So I called NE again and they still said that they had no record of the reservation or payment, so I had to make a claim against my credit card company for a refund. All this took several hours of my time and was incredibly stressful. It was a relatively small amount, but I was incensed by Ryanair's approach and determined to get my money back. They are truly shocking in their customer service. Only fly with them if there is NO alternative, even if other airlines are more expensive. Only buy the most basic/cheapest ticket and only upgrade or buy extras (seat choice, hold luggage, food, etc) as late as possible and just before your flight - in case there is a change of plan or cancellation, then your refund amount is much lower. Never purchase 3rd party services from their website - car rental, coach travel, hotels, etc. If there is a problem then they will screw you. I hope that this will help others to not make the same mistake in future
## 246 This airline is worse than any cheap airline in the US. They make their money for sure by us having to pay a lot of money on bags. I ended up paying nearly $500 going from Madrid to Rome and back which was nearly 3 times what I paid for the ticket. Mind you, this was a bag that only weighed 26kg which was almost 60lbs. No food or drinks served on the aircraft for free. Terrible service at the check in and terrible service on the plane.
## 247 2 hour wait in line, problems with online check-in, paid 275 euro check-in fee despite technical difficulties on website and was told to ask for a refund. When I asked for a refund I was repeatedly told that I should have chatted with support instead of asking for help at the airport. Extremely unhelpful, rude, and takes advantage of customers in the stressful hours before their flight. Worst flight ever, won't fly Ryanair again.
## 248 The flight from Poznan to Birmingham was most enjoyable flight. We fly 3-4 times a month but never received service like this.
## 249 Let me make it short. Near on time departure early arrival. Super friendly check in as security staff at Charleroi airport (love Belgian hospitality). Fantastic crew on airplane giving very professional service so much so that one of the ladies airline stewardesses took care of a baby while her mother went to the restrooms. Perfect service for a very cheap price, Ryanair I am a very satisfied customer.
## 250 Departure delayed for 45 minutes. Flight returned after 10 minutes to Stockholm due to a technical issue. Long queues at both the check-in counter and baggage check. Far-away terminal (Terminal 5 at Stockholm for departure). Aircraft not from Ryanair.
## 251 We are originally from Singapore & arrived in Frankfurt on Dec 15, 2021. We had booked a Ryanair flight to travel from Frankfurt to Catania on Dec 17, however, on Dec 16 we received news that\302\240the Italian govt has imposed an entry restriction on leisure travelers who had been in Singapore within the last 14 days. Since we suddenly became unable to enter Italy, we had to remain in Germany for the rest of Dec & cancel our trip to Catania. We tried to cancel our Ryanair tickets for flight FR 1558 and request for a refund for 321.96 \342\202\254 on Dec 16 but to no\302\240avail. We are very disappointed and what\342\200\231s worse is I was told by Ryanair that its refund policy does not cater for flights that are not\302\240cancelled by the airline but I could pay 180 \342\202\254 to change my tickets before the flight took off on Dec 17. Since we will not be in Europe after Dec to use the new tickets, a refund would be the only feasible option. It has been extremely troubling & thoroughly stressful for us since Ryanair wouldn\342\200\231t try to help us with the refund.
## 252 Ryanair refuse to give a refund or voucher for not being able to fly due to Covid. They say they have a fare change system in place but you end up paying more than just buying new flights. They are incentivising people to travel with Covid and something should be done to stop them. I had already booked future flights with them but I will be boycotting them from now on.
## 253 Following the confinement, I asked to cancel my flight since we no longer have the right to travel. Ryanair refused to exchange my flight for a voucher or refund. This is not supposedly their problem. Suite au confinement, j'ai demander a annuler mon vol vu que nous n'avons plus le droit de voyager. La compagnie Ryanair a refus\303\251 d\342\200\231\303\251changer mon vol en bon d'achat ou remboursement. Ce n'est soit disant pas leur probl\303\250me.
## 254 Very poor customer service, low interpersonal skills. It is very important to pay attention to your luggage. Trying to cheat on the size of the suitcase to get more money.
## 255 There is no word in the English language that can fully describe how bad this airline is. I\342\200\231ve had my shares of bad experience with Ryanair but always thought \342\200\234Well, my bad I should have been more prepared I guess\342\200\235 or \342\200\234they are probably having a bad day, cut them some slack\342\200\235 etc. But if you\342\200\231re going to be aggressive and verbally abusive to two senior travelers, then we\342\200\231re going to have a real problem. Even more if the seniors in question are my parents who have a limited knowledge of English. My parents came to visit us this weekend. They arrived in London fully prepared, vaccinated, passports, forms, VeriFly app literally everything that was required and asked of them. They flew in with BA at Heathrow and everything went smoothly (take some notes Stansted!). Then we prepared their return journey and they made sure to book 2 handbags (that\342\200\231s how it works now you have to pay for handbags too). So, prior to the trip they booked two \342\200\230less than 10 kg handbags\342\200\231 on the agency\342\200\231s website which gave them also the right to priority board (something they were not aware of). They actually waited and queued until it was time to board and once in front of the person at the desk were asked to pay \302\24390 for the two bags. My dad tried to explain he already paid for it, but she didn\342\200\231t want to hear it, she laughed to their faces because they tried to explain themselves with the few English words they know, and then she realized that my dad speaks Spanish (apparently, she did too) so they managed to understand each other to some extent. She lost patience and told my parents it was either they paid for the bags, or they had to leave them behind. Scared and tired by the situation they decided to pay and after they got the confirmation and the sticky tag on their bags asked if they could get an invoice or receipt. The lady said she didn\342\200\231t have it and that they will receive it by email. However never confirmed it with my dad and asked them to quickly move towards the plane and embark. Then someone - I'm guessing who's a security person - yelled at them in the corridor in English (remember a language they don't understand) and kept screaming and shouting at them for a good minute without thinking they might not be able to understand his language. Literally no patience, no kindness, no respect. My parents managed to connect the dots and gathered that he wanted them to leave the bags outside the plane (remember small handbags less than 10 kg) they pointed a corner to him, and he let out some kind of agreeing grunt. Then once on board they probably were thinking they could finally relax, but no, once again someone with a lot of empathy and sympathy decided otherwise. The hostess that day kept asking my mum to remove her jacket, and put it up in the overhead bin, then underneath the seat, then finally take it back and put it on her knees because it wasn\342\200\231t right, and every 5 minutes came back to check if she was "cooperating" because she also asked my mum to remove her scarf and for some reason it needed to be left with the jacket. What is wrong in your head? When a lady of a certain age is cold, you pressure her into removing her clothes? First, I don\342\200\231t get what the security hazard is with a scarf. Second, it\342\200\231s literally freezing outside, and we know how cold it can be inside the plane before take-off, also ever heard of covid. I mean come on. I'm curious to know if they provide the same type of care to all their passengers.
## 256 I wish I could rate as -1000! Numerous times extra fees, uncomfortable seat, terrible customer service (I don\342\200\231t even know if it does exist). Ryanair ruined my holiday trip. I've never been so disrespected in my whole life. Feel like I was robbed.
## 257 This morning with priority we arrived on the front of the queue and there was this lady who said we were not allowed to go on board because we needed a PCR test and she asked us to book another flight. We showed her our full vaccination, boarding pass, day 2 lateral flow test and she said she was sure we needed a PCR test. We asked to check it and then she said we were good to go.
## 258 I flew from Prestwick to Arrecife on 20/11/2020. Ground staff very friendly and helpful. The cabin crew were excellent. Really efficient providing a fantastic onboard service all with a smile and couldn't do enough.
## 259 Well, when a client asks for a glass of water to take his medicine and you say "no"...say no more. Customer service on the web - also from the worst I have ever seen! Didn't help at all, and didn't try to even look like they are trying to! And advertising 5 euros flights to end up with 100 per a lousy destination. Overall - Abysmal experience! Starting from the ticket purchase straight to the flight to Paphos and back home. And the charging money for almost every step the client takes, really no words left.
## 260 They are fraudsters. Don\342\200\231t let their stated prices misguide you: they will charge you at least 3x or 4x the amount. And not only because they don\342\200\231t mention numerous additional fees, which alone cost much more than the stated ticket price. They will also try to charge you for services that you did not buy. I really cannot understand, what kind of a company can have a single priority: to cheat on their customers, to fool and deceive them. But that\342\200\231s Ryanair! The feeling of being a victim of an air company\342\200\231s fraudulent manipulations is awful, it\342\200\231s like when someone steals your wallet. So, my advice - don\342\200\231t let such things spoil your journey and choose a more honest and decent company instead. Also, the staff were very rude and unprofessional, but comparing to financial fraud they practice, it does not seem that big.
## 261 The ground service was terrible, but you can\342\200\231t blame Ryanair as it is outsourced to a different company. Check-in was slow, boarding disorganized, priority boarding passengers did not get their priority. Bought the first row seat on the right, 02F. Great Legroom, and the only seat with a storage pocket. The food which you could purchase was okay, I would recommend going for the croissant. Overall, the flight was definitely worth the price. I strongly recommend buying an extra legroom seat if your flight is longer than two hours.
## 262 I was quite apprehensive about booking with Ryanair having read many poor reviews, so, I read and reread the booking site until I understood what was required. The booking process was simple and easy to follow and I completed it without problems. There was a flight time change which was notified by email. On the days of travel both flights were on time, both staffed by pleasant and efficient cabin crew. The cabin was clean and Covid rules were followed. The seats were OK for short haul flights but hard. We used neither catering or duty free purchasing.We had an enjoyable experience and have no complaints. We will certainly do it again.
## 263 As I was unable to do an online check-in because of the mistake at their end, the website was not sending one time code for verification. They charged us 55 euros per ticket for check in at the check in counter and when asked about their mistake they said it does not matter if our website was not able to send you a code., we can not do anything about it. This is just a way to rob common people even if the mistake was at their end.
## 264 There were 2 flights one after the other (as I discovered later) at the same gate in a far corridor without speakers. I was at the gate one hour before a few meters from the desk, in the photo you can see how close I was. I had other people around me waiting for the next flight so I was not aware the gate closed. My name was automatically called in the airport but not in that corridor and the very unfriendly employee didn't say a word like "the gate is closing any other passenger?", not a word. When I got aware he simply repeated "the gate is closed" without neither watching me in the face or answering to any further question.
## 265 I have been forced to pay an extra of 45(ish)\342\202\254 at the gate for the same hand luggage that I brought for free 4 days ago. All the staff at the gate were stating that I had no right to bring a hand luggage with me, and they kept denying it even though I showed them that on Ryanair's website it is written that 1 hand luggage is always included. Not recommended all, I will never take a Ryanair flight anymore.
## 266 In a covid world the cabin was disgusting, it does not look like things have been cleaned enough or to a good enough standard. As soon as we got to our seats there were marks and when opening the food tray it was absolutely disgusting with splash marks all over it.
## 267 Our flight from Crete to Athens started off with online check-in issues. We followed the prompts, but there was no option for check in, only to cancel or change flight. We even watched a video but never was presented with a check in option on the mobile website. When we arrived at the airport, we spoke to one of the employees at the bag check line, and explained to her our issue with online check in. She offered no help or advice, only said there is nothing for her to do and that we must pay \342\202\25455 each to print our tickets or we could speak to her coworker at a Skyserv help desk. We proceeded to the alternate employee at the Skyserv booth and once again explained our troubles with online check in. We even showed her the step by step process in which we tried to check in on our mobile phone. She started to raise her voice and said \342\200\234I don\342\200\231t know why you\342\200\231re the only people having an issue. Other customers don\342\200\231t have this issue. It\342\200\231s clearly something you did wrong!\342\200\235 Instead of providing us with actual help and presenting a fix to the issue that we physically showed her on the phone, she was dismissive, blaming us, and outright rude. When we wished to escalate the matter, she refused to tell us her name and began acting even more erratic. She stated that \342\200\234Ryanair will know who I am and I don\342\200\231t have to give you any information.\342\200\235 At this point we were forced into making one of two decisions - miss our flight or pay \342\202\25455 for each boarding pass. Extremely unsatisfied with the lack of help, we returned to the bag check desk, and decided to go ahead with the payment. At our second interaction with the bag check staff, we were informed that the price per boarding pass is now \342\202\25462.50! We showed them the Ryanair email that said it was \342\202\25455 and explained to said staff that she told us ten minutes prior that it was a \342\202\25455 fee. The employee told us to look at her screen if we have an issue, because that\342\200\231s what it says and she could give no explanation for the discrepancy in Ryanair email or what we were previously told. At this point we were uncomfortably coerced into choosing to either miss our flight or pay this new arbitrary price that no employee could give an explanation for. No one can explain to us why we were unable to check in online and no one can explain to us why there was an increase in price after this entire debacle. Fast forward two months after this incident and multiple complaints to Ryanair, they finally responded with again no resolution. A representative from Ryanair emailed stating, "At first, I would like to express our sympathy regarding the circumstances resulting in you being unable to have done the check-in online. However, if a customer does not manage to check-in online then an airport check-in fee of \342\202\25455/\302\24355 per person is applied." This acknowledges our inability to check-in, but somehow still place the blame on the customer. When questioned about why we were arbitrary told to pay \342\202\25462.50 by the bag check staff when Ryanair and this representative's email clearly stated \342\202\25455, another rep responded back with, "Unfortunately, as per the previous responses you have received, our standpoint remains unaltered that means according to our agreed Terms and Conditions Article 10.1 all monies paid towards Ryanair are non-refundable." So again no explanation. It really feels like a "you have to pay whatever amount we tell you or you get to miss your flight" situation. Ryanair is all about customers' dollars but not customer service!
## 268 Arrived at the gate in good time at stansted and the crew at the gate told me off for arriving when they had only just called final boarding. Told my husband they were lucky they were letting him on the flight. The flight was ok out, until one of the crew shouted at the man next to me whose small washbag had broken and was trying not to drop things out of it as he was putting it in the overhead locker. Arrived with all documentation, getting my PLF form sorted to show the gate on my phone and was asked if I\342\200\231d had a Covid test (this was Italy now trying to return) all paperwork complete and was told not to bother showing my PLF as needed a Covid test and wasn\342\200\231t allowed to board. We are fully vaccinated and have our day 2 tests ordered. Still refused boarding, despite saying we didn\342\200\231t need them but he wouldn\342\200\231t/couldn\342\200\231t speak English. Took a taxi (\342\202\25460) to get a test (\342\202\25430) & bought tickets @ \342\202\254270. We don\342\200\231t need a Covid test, should have been allowed on our flight and as Ciampino airport closes overnight we are being made to sleep in the street. Well done Ryanair, great customer service and care for customers yet again. I am standing outside the airport now can hoping for a dry night as this will be where I will be.
## 269 I booked multiple flights with Ryanair, but I only needed to check baggage on one of them. I accidentally added it to the wrong one (60EUR), and when I contacted them to switch it to the right flight I was informed that it was "against company policy" to do so. Do not expect any form of customer service.
## 270 I had bad experience with flight. Flight was 30 minutes delayed. We have to stand out in cold for getting flights to ready. Flight was full although the crew members are trying their best to give. Toilet was dirty and unhygienic. Please serve at least bottle of water to the passenger for free.
## 271 First time travelling since pre COVID and thought I could check in at the desk with my bag. I was fined \302\24355. No complaints but it would have been good to get a warning via email, also the employee checking me in at Bristol was incredibly rude and aggressive, no pls or thanks when taking my cash. Return leg I had already paid \302\24370 for a checked bag booked via skyscanner. On the way back, the app was trying to charge me for a bag as I checked in. When I got to the airport, I was informed that I was to be charged \342\202\25460 to check the bag in. Both staff dealt with were incredibly rude, offered no apologies and said it wasn\342\200\231t their problem as I had booked on a third party website. When I complained that I had already paid for my bag, they threatened to cancel my flight. Zero customer service, \302\243130 paid for a bag; and why do Ryanair use Skyscanner and other websites if you should only book on their website as their employees told me at Knock?
## 272 Another good value Ryanair trip with seat choice and checked bag. No major drama to report with this value product. On time as usual, clean aircraft and rather smooth process for check in. I did like that staff were on hand to pre-check papers before the check in desk. Quite smooth. Cabin crew however were looking tired and disinterested in each other and the service on a whole from them was lacklustre. No smiles no friendliness and very poor English language abilities. Other than that it was good. Always been a fan of Ryanair and will continue so.
## 273 Ryanair does not have any respect for the customers and are just a money seeking airline. They do not see the mistakes of their own, but of the customers only. From check-in to security check up until getting on the flight it was full of chaos. Although we had plenty of time left, we had to be in a hurry but at the end we, us ourselves, found out that the plane was delayed. They did not make a single announcement about the delay, or sorry for the inconvenience. All they did was sit and do nothing. Thanks for ruining my trip to London. They charge you 3 euros for a bottle of water. Due to the run I had to make to the gate, because they had their problem, I needed water, but no! It's Ryanair, they will charge you for every single penny. I hope they fix their problems for other future customers.
## 274 I did a COVID test in Italy, they gave me the result in Italian, as I was in Italy I couldn\342\200\231t imagine that the result had to be in English too, on boarding they didn\342\200\231t me allow to get to the plane and told me to talk with their staff at check in and to do another test at the pharmacy. I spoke with them and they told me I had to pay 200 euros to fly in another flight because my flight had 30 min to departure. The worst airline in the UK. I had a test that was not in in English but anyone can read that it was negative, what\342\200\231s the difficulty for an Italian born to read it?
## 275 Coming back from Corfu was a nightmare. I am not moaning about our flight being cancelled because that may have been out of Ryanair's hands but the fact that they did not help with anything after we were told that the flight was cancelled is unbelievable! We were told to book our own flights and find accommodation. We were offered no care packages which are promised if your flight was delayed, in fact we were offered no help at all. We tried all night to talk to Ryanair through their app which was a total waste of time because we were never connected. We didn't have any children with us but many people did and their accommodation and flights must of been astronomical to rebook. I can not believe how they just dismissed us from their minds. I will think twice before using them again and I will definitely not recommend them to anyone
## 276 Because we had 2 bags that were slightly bigger than the requirements, they charged us 92 euros. I had never had problems with that luggage as cabin baggage in other airlines.
## 277 I hadn't been travelling for 2 years since covid. I used to travel a lot but always was flight 'sick'! I hate take-offs and landings and I think that the best take-offs I had in years was on my flight to London! It was smooth and neat! Pilots don't often get to be congratulated on their skills but I do believe that it takes a lot to ensure that the experience on the flight is seamless even with a couple of turbulences! So congrats to the crew for making me want to travel again despite my fears!
## 278 Delays may happens but behavior of Ryanair is not customer oriented. With 3 hours of delay they sent voucher for just 4 euro meal, available only in cafes outside the departure area. And the delay of the departure is declared 2 h and 55 minutes in order not to pay compensation as per EU rules that starts with 3 hours delay.
## 279 I returned to Kyiv City (Borispol) from Cracow aboard Ryanair flight FR7262 on the evening of 11 September 2021. Owing to circumstances beyond my control, I was unable to complete the check-in process online (due to technical difficulties) prior to my departure for the airport. Arriving at the ticket counter 5 hours before the flight's scheduled departure, I approached the ticketing counter, explained my dilemma to a ticket agent, and with her able and timely assistance was able to implement a work-around on my mobile device which enabled me to eventually obtain my boarding pass. The agent was courteous and patient as she worked to sort out my problem. Ryanair's business model is predicated in hyper efficiency, so traditional "customer service" per se often suffers, and often results in decidedly mixed reviews from travelers. Thankfully, there are exceptions to every rule and it is my pleasure to proffer two thumbs up and a well-deserved Five Star rating for my recent experience.
## 280 Do not book car parking with this company - when they mess it up they refuse to respond to letters, e mails or phone calls. I followed their instructions to write to customer services which I have done so twice, emailed twice and phoned several times but no one responds. They owe me \302\24399 for parking at Stansted that was never prearranged for me despite the deduction from my credit card - their customer service facility is a con and would appear to be non existent apart from a recorded \342\200\234we are too busy to talk right now\342\200\235 message!
## 281 The most horrible airline I have ever flown in my life. First I bought my ticket thinking I could put a piece of luggage in the hold, I had a doubt so I contacted Ryanair chat who confirmed that I was entitled to a 10kg suitcase in the hold and when I arrived for check in, the agent told me no and I had to pay \302\24335.99. I went to visit my parents in France for 3 days, following the English law, I have to do a PCR test 2 to 3 days before my departure to come back and after 2 days when I arrive on the UK soil. This is what I did, last Thursday when I wanted to board to come back home in England, the agent for the check in told me that my health pass has expired by 2 hours and that she can't check me in. I found myself alone in a city I didn't know, I had to take a taxi to go to the nearest city + take a hotel room at my expense. Also I had booked a hotel in London the night I arrived and unfortunately I lost my room. The worst day of my life even though I had made the necessary arrangements. I was in a small airport near Rodez and there was no flight to London until Sunday. The next day I had to go to the pharmacy for another test + buy a train ticket to Toulouse and then take another plane to London. In total I spent \302\243300 because of a person at the airport who was incompetent and did not help me at all. I can swear that in these situations you feel really alone. I flew with Easyjet the next day and had absolutely no problems, they are really nice and friendly.
## 282 Terrible customer service, painfully slow check-in and shockingly incompetent organisation/administration. At check-in, Ryanair staff directed dozens to just a couple desks. We waited over an hour and a half and, despite arriving nearly 2 hours early, ended up missing our flight. At least a dozen people also missed our same flight, not even mentioning people on other flights. After a long battle with customer service, we learned Ryanair had effectively zero plans for any rebooking, refund or compensation. I beg you, please, please do not fly with them. They are scam artists and nothing else.
## 283 Worst company I have ever flown with. Very long and crowded lines to check in the bags (almost 90 minutes waiting just to check in!). In addition, when we were close to the counters, they announced other flights should pass us. That caused a huge mess in the lines and made us loss our place in queue. Finally, the line to the boarding was not organized as well and very crowded. Very bad experience!
## 284 I had a very small luggage pack and they made me pay for it \342\202\25450. When I have tried to pay for my luggage, they didn't accept my cash, so I tried to pay with my Bank Card, but my bank was not accepted. Furthermore during the whole process there was a lot of pressure from the personal. I don't recommend to use this airline.
## 285 Very bad experience because of unprofessional staff. The cabin crew insisted that only large bags should be stored in the overhead lockers. The seat belt sign was on the duration of the flight despite that no turbulence was experienced. They advertised the food and drinks and merchandise a lot despite I did not see anyone buy any of the items on display nor any of the food besides a few bottles of water.
## 286 Just the worst. Queuing for nearly an hour to check a bag, then again waiting to board. Had to fly Ryanair for work and in future I make a note I don\342\200\231t fly Ryanair.
## 287 I was tested positive for covid-19 before my flight, for this reason I took and insurance covering a refund in such cases. However , I cannot reach ryanair in any way, chatbot is useless, phones are not being picked up, the refund application form doesn't approve the code of the booking as it is from Bulgaria and the only options are (FR;UK LE). There is no e-mail or customer service in Bulgaria so there is no way I can actually reach Ryanair to apply for the refund which is ridiculous.
## 288 I had always promised myself I\342\200\231d never fly Ryanair but this time they were my only option. First up, booking and checking in etc. I found it pretty simple, I heard horror stories about people being charged ridiculous sums at checkin for boarding passes etc but so long as you read the instructions on the website you can\342\200\231t really go wrong. And that\342\200\231s the only positive thing I\342\200\231m going to say about Ryanair. The aircraft was a new looking 737-800. On my flight out to bud from stn I was lucky enough to have an entire row of seats to myself, despite the rest of the aircraft being near capacity. Any airline I\342\200\231ve flown with, in hot weather, will have the cabin a/c active for boarding. Not Ryanair. We sat in 30 degree heat for about 30 minutes with not so much as a breeze. That didn\342\200\231t really matter though, because the overhead fans were just awful. On this aircraft were recessed into the facia, so the direction couldn\342\200\231t be altered. Add to that the \342\200\234breeze\342\200\235 wouldn\342\200\231t have been sufficient to blow out an already fading candle on a child\342\200\231s birthday cake. I had two fans pointing vaguely in my direction, both set to full, both failing to live up to their job descriptions. The seats were they bad, narrow and with about 2mm of padding. Now for the speedy boarding scam, I was standing in the terminal in BUD with the rest of the non speedy folk while the last of the speedy boarders had cleared the gate a good ten minutes previously. I was a little miffed up until I saw the speedy boarders all standing in a \342\200\234cage\342\200\235 section of the air bridge (pictured) completely in air conditioned and completely open to the more than 30 degree heat. Contrast that with the regular folk who were enjoying the departure gate a/c. Both my flight to BUD and return flight to STN arrived late, yet Ryanair insisted upon playing their obnoxious fanfare. A truly horrible experience and I really hope I never have to fly with them again.
## 289 Ryanair should be shut down. They don\342\200\231t hire enough staff to get people on the plane even if you are at the airport early enough. Basically in beach or law. They are rude, and it\342\200\231s a mess. They should be heavily penalized or shut down. More of a public menace.
## 290 I have to say grumpy staff at the check in is already a terrible start. Not everyone flies all the time and knows where to go. I watched the lady first deal with another client. She should not be allowed to deal with people the way she speaks to you. Then I had the same at C05. If this is anything to go by I will avoid Ryanair for sure. Eurowings I had nothing like this. I cannot believe how rude and how the staff don\342\200\231t care.
## 291 Simply the most inhumane airline I have ever run across. I tried to get help at the Barcelona Ryanair ticketing counter. Then went to their ticketing counter in Mallorca and I tried the boarding staff. Every single person was absolutely rude and unhelpful. I watched a man have to put on layers of clothing so he could board the aircraft within their carry on baggage rules. He had nothing and they just watched as he put layer upon layer of clothing. You know as soon as he boarded he would take off the clothes. I am 60 yrs old and travelled all over the world many times and have never seen such disgusting behaviour.
## 292 The ground crew were friendly and efficiently handled the new document requirements for travelling to Italy during the Covid-19 pandemic, including the new EU Digital Covid Certificate. From boarding to deplaning, everything was \342\200\234Covid Clean\342\200\235. Our 2 hour 40-minute flight from Sofia to Treviso was on an older 737-800, but it was still relatively ship-shape. The legroom was as expected (dismal) and the snack wasn\342\200\231t anything to write home about, but the crew were great. The bottom line: Ryanair is what it is - Cheap.
## 293 Flight was on time and staff were friendly, nothing to say about that. My traveling companion and I had to spend 10 Euro extra each only to have seats close to each other, but this is a well-known part of the deal with Ryanair, so I cannot complain about that either. What I find unacceptable is that, in spite of their assurances, precautions against covid-19 are almost non-existent: to board the plane, people have to stand in a tightly packed line, after that, we were made waiting in a tightly packed corridor without windows. On the plane, although it was announced once at the beginning of the flight that masks are compulsory, about half of the passengers did not were them, but the crew seamed not to bother. When I complained about that to a flight attendant, she answered that they were going to make an announcement about that, but that did not happen. In this period in which a common effort is needed to allow our lives and economies restart without making the pandemic restart again, Ryanair is not making its part!
## 294 I have flown with RyanAir many times and I know what to expect since it\342\200\231s cheap. But yesterday was my first flight since COVID-19 started. Everything was the usual, but there was one thing that I just can\342\200\231t help being really really annoyed about. The fact that the place three family members in three different places in the plane (an eleven year old girl alone) during times where we should keep distance to other people. I know as a fact that they did this to other families as well, as I asked the guy next to me to swop seats with my daughter. He got very happy as my daughter was sitting next to his brother. I know this is part of their policy that you have to pay for choosing seats next to each other but during COVID-19 this is simply not good enough. Shame on you Ryanair!
## 295 Very bad customer service. When I tried to contact by phone this was answered with an automatic reply and later it was simply dropped. When trying via chat I had to wait almost 5 hours until I was told a contact. However, he could only give me the information I already found on the internet. So I was not helped further. The prices of the tickets are cheap and you can definitely see that in their customer service! Not recommended! Zeer slechte klantenservice. Toen ik contact probeerde op te nemen via telefoon werd dit beantwoord met een automatisch reply en later werd het gewoon afgelegd. Bij het proberen via de chat moest ik bijna 5 uur wachten totdat ik een contactpersoon te horen kreeg. Die kon me echter enkel de informatie geven die ik al vond op het internet. Ik werd dus niet verder geholpen. De prijzen van de tickets zijn goedkoop en dat zie je zeker terug in hun klantenservice! Geen aanrader!
## 296 I had positive experiences in the past with ryanair, better than other low cost. This time though I felt it's important to share. I do not recommend to buy tickets with them now in time of COVID. Ryanair promises to change your flights free of charge or extend voucher, but one week before flight. I supposed to fly to Bologna from Prague, pre condition is to have a PCR test not older than 3 days. My husband got positive and obviously we had to go to quarantine. I reached out ryanair and only option available was actually to change flights, but for every option they were charging full price extra for luggage (it's 40 euro on top of 50 I have already paid for luggage) and therefore any option I was extra I have to pay to keep tickets was way higher than to buy completely new. So I've asked if there is a way to cancel and get at least something back even through voucher to use it for other flight, but 150 euro of one ticket thrown away. But in this particular case it's cheating on clients: we are doing here tests on weekly base and you cannot predict to get Covid before flight if you were fine week before and extra nearly full charge for luggage on top is really stealing money. Now my feelings are that if I have to fly, next time I will buy tickets with someone else.
## 297 This was my first flight with Ryanair. The airplane still had the old cabin so the seats were not so comfortable, and the seatpitch was not too great. Boarding went quite fast, and we departed on time. There was catering on board but my debit card didn\342\200\231t work, so they handed me the bottle of water for free. Can\342\200\231t complain about that! The cabin crew was nice during the flight. Overall a great first experience, definitely because I only paid \342\202\2545 for this flight!
## 298 I had a 3.5 hour delay because of predicted weather conditions. The airline notified me a day before departure. Not there fault of course but i did arrive quite late in Pisa. Boarding went pretty fast, we had to wait outside for 10 minutes, but it went fast overall. The flight was fully booked. It was a plane with the newer seats which had a surprising amount of legroom. The seat however was a little uncomfortable. There was catering on board. Overall i think it was a great flight, especially because it only cost me \342\202\25425. I will definitely fly Ryanair again soon.
## 299 Flight was cancelled because of 'ongoing changes to travel restrictions'. However, neither Belgium nor Austria currently have travel restrictions that don't allow people to travel in place. I called the Ryanair customer service, and they said "we don't have any further information on why your flight was cancelled, and there is no way for you to obtain such information".
## 300 My girlfriend purchased our tickets we flew in for vacation from the US and we vacationed in Santorini however we made plans to fly to Athens while in Greece and spend a night in Athens since we made plans to go to the Acropolis and had dinner reservations. I believe this airline purposely shuts down their site at some point my girlfriend was trying to check us in since the night before and was unable to. She tried before our flight the next morning same situation she kept getting an error. We go to check in at the airport the lady tells us we have to pay a fee of $68 euros each person which is about $83 US dollars because we didn\342\200\231t check in online. I tried explaining that there was an error online and we were unable to. Meanwhile two other customers had the same issues and one guy was literally yelling in the airport. She told us that unless we had a screenshot there was nothing they could do. Frustrated I paid the money for both of us.
## 301 Ryanair does not always enjoy the best reputation. My last flight with them was really OK: on time, clean plane and covid-19 conscious staff and passengers, seats as usual (not really uncomfortable), very good price and very convenient time of flight (arrival at 8:15 am in Rome is perfect.
## 302 Had flight booked, as advertised you could change at no extra cost. What an absolute load of rubbish. Tried to change my flight which I could do as long as paid \302\243127 extra on a flight out of season. Went on their website where I could book the exact same new flight as a new customer for \302\24319.99. So just lies do not be tempted by their advertising.
## 303 As hard as it is in these days due to pandemic situation, worst that could happen to us is to be separated from our loved ones. I waited for almost 6 months to be able to go home and be with my mom. I have tried to fly out using another airline, two days prior to the current flight I took with Ryanair, and to my shock I was denied to fly because I didn\342\200\231t have the identity card to be in the country I was flying in. I had the test results, which were negative, the declaration form. Which I thought I was ready to go. Only because I was not a resident in Italy, I was denied. I emailed the Italian embassy as I was going back home, confused and desperate. They emailed right back and said that I don\342\200\231t need a permission to enter the country. I found as well the updated info regarding flying to Italy, anyone could fly not only residents from April 7th. I then bought a new airline ticket from Ryanair. More affordable and to my surprise such a COVID 19 friendly use. For example, it has an easy access to all the forms necessary to fill in. And when you check in you upload all the forms and you are all set. All I did at the airport is to check in my big bag and go straight to the gate. I had to ask the person who checked me in if she\342\200\231s going to check my documents and forms. She said no, because they have them all online as I submitted them. And the COVID test that I took on April 6 was still valid on 11th April and I didn\342\200\231t have to take another one. I still did, and spend \302\243300 in total. Thank you Ryanair for making this possible for me and my family. I will forever be grateful.
## 304 They cancelled my flight in December, which I should be entitled to a refund for. They "delayed refund for more than 2 months" and finally come back to me with paperwork claiming I didnt book through their website so I need more ID checks. I did book through their website they're just stalling trying to keep my money in any way possible.
## 305 I had a flight to Tenerife from Luton. Having everything prepared and well informed on the conditions of travel me and other people were forbidden to fly on the grounds that on the same day flying rules had just upgraded (new COVID rules upgrade). I know that these are unpredictable times and one assumes responsibility for his/her journey,yet there was no update on the website. They wouldn\342\200\231t talk to us, there was this lady that wouldn\342\200\231t give her name that was repeatedly shouting \342\200\230you won\342\200\231t fly today\342\200\231 and when contacted the service support was you just call your embassy etc. I guess humanity and manners not in the vocabulary of Ryanair, and yes I think one person representing the company is the entire company.
## 306 Phoned an operator at Ryanair.We told them we both couldn't fly to Spain for our holiday on 13th February because of lock down regulations and the implications of this. With Goverment guidelines we. would be breaking the law. Sent letters, emails and finally got through to head office by phone. Their response was we are still flying and because of this you are not entitled to a refund. Paid \302\243400 for return flight to Malaga from Stansted, the operator said I could change the date for an extra \302\243136, \302\24390 change fee, and \302\24346 flight difference on top. \302\243536 hardly a budget airline to fly to Malaga! I didn't take this insulting offer as I knew several months down the line the same thing would happen again!
## 307 I don't recommend this airline to anyone. The service is horrible. My flight was cancelled and after 5 months I am still waiting for a refund. The price is also not so cheap as they claim because as you book, the add-ons e.g. price of luggage or seat booking, priority booking make the total price equal non-budget airlines but with much worse service.
## 308 I can't say flown because even though I've booked tickets with them twice, and they've taken my money. I have never flown with them. The first time I showed up at the gate at Gatwick, I was told I could not get a boarding pass because I was from Canada, even though we had a lot Covid-19 infection rate, but OK. When I tried to get a voucher I was told that since the flight was able to leave, I did not qualify for a refund/voucher. The second time, I check online update to confirm my flight has not been cancelled. After putting in my flight details, I get a response that says "No flights found for the search criteria". I contact their live chat. They say that the flight has not been cancelled but to check flight update online to confirm. I told them I did and what the response was. The answer was "I assure you it's not cancelled, but you can check flight update online to conform". The airport is a 4 hour drive from where I live but I'm supposed to drive there (and back if cancelled) based on his 'assurance' when even the flight update does know what's going on.
## 309 I use to fly between Germany and Spain about 20 roundtrips a year, usually on Ryanair. I consider Ryanair's product to be well suited for my needs. Just a seat, no frills, low price, easy way to get from A to B. Nevertheless within the last weeks Ryanair has started to arbitrarily cancel flights due to a low load factor. Somehow I understand this, when there is a sudden change in government rules and people just stop buying tickets. But now Ryanair just cancels whatever flight, that was offered a few weeks ago, just because their load factor is too low for their needs. This happened about two weeks ago and I had to rearrange my travelling, throwing away a couple of tickets from the 8 flights I had already booked with Ryanair. Now they do the same thing once again and my travel plans are totally screwed. From the few flights Ryanair offers, they just cancel whatever flight they want to, obviously without compensation. Therefore I strongly advice to NOT book any Ryanair flight, unless there is normal travelling available maybe in spring 2022. Until then, stick to the serious companies that do fly, when they offer flights.
## 310 Due to COVID restrictions we were unable to enter Spain on our 27/12 due date. We Paid over \302\243600 for flights and were told we were not allowed a voucher or refund despite this not being our fault we were told we also had to book before mid March or lose the flight. These alternative flights cost less than \302\24360. We were told we then had to pay a further \302\24318! The person on the chat line for Ryanair was very rude. We take nearly 20 flights a year with Ryanair. Treating your loyal customers like this is a sure fire way to going bust.
## 311 Didn\342\200\231t expect such a comfortable flight with Ryanair. I flew from Dublin to Amsterdam. The flight was less expensive then the panini onboard (\342\202\2545,). I didn\342\200\231t have any luggage with me so the total costs including seat reservation summed up to \342\202\25411, which was less expensive then my commute to the airport. The plane left on time both ways and we landed earlier. Seat quality was quite good, I expected less for \342\202\25411,. I am 1.80m tall and my legs weren\342\200\231t cramped against the seat in front of me. 20 minutes after take off the staff started serving food, with a pretty wide variety of options. I don\342\200\231t know if it was a precaution or that the flight was just empty, but almost every row was not fully occupied, so that social distancing was possible on the flight.
## 312 I booked return flights for two directly with Ryanair at a cost of \302\243662. The flights were cancelled. I applied for a refund. I then received an automated email saying that they could not process the refund as I had not booked with them directly. I forwarded the booking to confirm that I had in fact booked with them directly. Nothing. I have tried to call many times and after going through the options I am told that their customer advisors are busy and the line goes dead. The chatbot does not work. Emails go unanswered, save for an automated reply inviting me to accept a voucher. I now have to contact my credit card company to try and get a refund. It is astonishing that a company can get away with this kind of behaviour. I had known that their reputation was desperately poor but I am still surprised and dismayed that the regulators do not take action against them, as I assume that my experience is not unusual.
## 313 During covid, ticket exchanges were announced to be free. In fact, they disregard you previous ticket's priority, and charge you 10-20 euros for the new priority on the new ticket, WITHOUT giving an opportunity not to buy priority for the new ticket. In effect, the minimum exchange fee is the price of new priority. This is misleading. Of course Ryanair will pinch your penny on your baggage.
## 314 Another great flight. Very good system in place to feel safe during Covid. Staff are as usual very polite and good. Stick to their rules and you are bound to have a great value flight.
## 315 My daughter and I flew last week to Belgium from Malaga for just under the 48 hours allowed without quarantine. Brilliant service. New aircraft On time both ways I was expecting a tiny space as I haven't travelled with them for years. It was extremely comfortable and did not feel cramped at all. I will use them next time.
## 316 Ryanair gave a promotion of no fees to change a flight, so I booked my flight on the 10th September, to fly on 3rd October to 13th October. Unfortunately, the Government put travel restrictions (for Poland) as 14 days quarantine on arrival to UK after the holiday (activated from 4 am, 3rd October). I could not manage to get 2 weeks extra holiday, so I changed my mind and I tried to explain this to 4 customer service agents (from 11 am to 4.30 pm), they showed to me their standard rule is a 7-day change rule and did not let me change my ticket date with fees free promotion. They said - I can only change my ticket before 7 days prior to the flight. They are not a legitimate company, there are so many hidden fees. I paid for my tickets (3 people) 203 GBP with parking, but to change my ticket, they asked me to pay 350 GBP (appx.) including seat booking, extra baggage, everything I have to pay again even though I haven\342\200\231t used anything. Also, they got my money for parking 10 days into a long stay, but they said they are not responsible to deal with my parking at all. So, why do Ryanair people keep scamming people like this. My suggestions to everyone, please stay away from this budget airline, they have got tonnes of hidden fees. My experience is - if you give them your money and you want to change anything, they will rip you off. So, be careful, ignore Ryanair at any cost, nothing is free with them.
## 317 On my flight from London Stanstead to Perugia I boarded around 6:10 am and one of the hostesses impressed me with her ways of treating people. At some point in the middle of the flight I wanted to get up to use the loo, I've seen other people standing up or taking their bags but once I approached the loo, the hostess got up from her corner and started yelling really loud go away, go sit down. I would invite the company to do a revision of their staff and to train their people on how to better interact with passengers. What she should have done instead is to politely explain, why I am not allowed to use the loo.
## 318 Not a nice situation with the extra fee for the checking-in at the airport. It is true that the information about the additional costs at the airport is included in the carrier's regulations, but the ground officer at check-in point did not inform about the additional fee. I wanted to check in my luggage which was previously purchased but it was invisible in his system. He asked me for a credit card, He said it is necessary to check if the baggage was actually purchased, it resulted from the conversation. Unfortunately, I didn't ask if he just wanted to check a baggage fee. Then he issued a bill, as it turned out, he did not check the baggage fee, it was just a fee for checking in at the airport. So, my bad i didn't check the regulations but I ask why personal does not inform about additional fees, costs etc.
## 319 Ryanair totally mislead with bookings while Coronovirus is going on. Says you can cancel and rebook at no extra cost but totally misleading. Try to change booking and you are charged a great deal more. I booked to go September 2020 to Malaga but with government changes and so therefore not covered with insurance it was to dangerous to go. My friends booked Jet2 and were refunded straight away. I will not book Ryanair in future and I fly 3/4 times a year, now Jet2 has my business in future and I do not think I will be the only person deciding this.
## 320 Earlier this year I booked a return flight from Paphos to Stansted. One sector was cancelled and I was offered a free rebooking. With the onset of the pandemic I rebooked for September. The system would not let me rebook just the one sector and charged me a rebooking fee for the sector which had not been cancelled. Fast forward to today; flight back from Stansted cancelled; offered free rebooking. Assured repeatedly on the Ryanair app that the rebooking fee would not be charged at the end of the process. Surprise surprise! I was charged the rebooking fee for the outbound flight, which I had not changed. Moral of the story is to make each sector under a separate booking. Or choose another airline.
## 321 Bag drop at Edinburgh efficient but staff miserable. On board both ways the cabin crew were fantastic. Polite professional and nothing was too much trouble. Handling at Tenerife also excellent. Quick and efficient. Would recommend.
## 322 The worst customer service ever especially in Poland. Arrived to Poland with two paid cabin bag (have been travelling with the same bags for the past no of years) but on my return apparently one of those bag was "too big" and I was asked to pay double to take it on board. Extremely rude staff. Have never experienced such bad customer service. Not to mention that Ryanair owns my money for 4 cancelled flights since March. The flight was on 29/8/20 from Modlin, Poland to Dublin, Ireland. I was ripped off and had to pay crazy money for a laptop bag. The bag was perfectly fine five days earlier while I was travelling to Poland. I hope that the operator will not survive the Covid restrictions as Ireland desperately need a decent airlines (it's a pity that Aer Lingus do not fly to all destinations).
## 323 After Covid-19 I requested a refund of my money, then after a month they sent me an email saying that I got a voucher and if I want a refund I need to ask for it. I didnt ask again since I had already asked for a refund and the request was accepted. Now on August I find out that I was never in a queue for a refund, and their excuse is that they asked me that if I want a refund I had to ask for it! This is fraud! Now I have to wait for a refund like I just asked for it, waiting for a queue again! In addition, I bought a travel insurance for my flights, and after covid 19 cancellations, Ryannair informed me that they will refund the flight cost excluding the travel insurance cost. Their response was that because I could use the travel insurance for compensation. But then, when I asked if I can get compensation, they told me that according to the terms and conditions, I cannot get compensation for the cancellation. So they kept the insurance amount, even though there is no way to use the travel insurance! I imagine how much money they made from the travel insurance of milions of travelers that never used this travel insurance!
## 324 Blatantly deceiving their customers into thinking they are protected with new bookings with free amendments but it\342\200\231s all lies. If you go to book the flight outright it is half the price of the flight when you are changing it to a new one. So they aren\342\200\231t officially charging a change fee but it is absorbed in the new flight price. Just shady and misleading. =
## 325 This airline is an absolute disgrace, the treatment of customers is truly awful, we have had issues with 3 flights this year, I appreciate that corona virus has caused massive problems across many industries, non more so than the travel industry but the complete and utter disregard shown for its customers by Ryanair is nothing short of unbelievable. This year alone they have told a party of 7 that they could either change there flight date or receive a full refund due to a Covid related issue, we selected the refund but did not receive anything, when we contacted them again they said that they could not give a refund but could change the flights, which we then agreed to, again we heard nothing further and the flights did not change, once again we contacted them and they said that they could not change the flights and we would have to wait for a refund, after several more conversations we ended up changing the flights. These flights were booked to attend a family wedding and the revised flights had us returning early morning the day after the flight, we have logged onto the app tonight to check all the details to find that the return flight has been changed and they have not made any attempt to inform us. The return flight are now 30 minutes before the wedding was due to begin. When we were told for the second time that we would have to apply for a refund we were also told that no refunds would be paid out until the corona virus pandemic had ended. On a separate flight for the honeymoon of said wedding we have spent literally 3 full days waiting to talk to a member of the team on the live chat only to be left sat in the queue all day on each occasion. We regularly travel between Manchester and Naples to visit family and this is the only airline which flys regular direct routes between the 2 airports or I can assure you, we would never fly with this company again. I cannot express in words what a poor excuse for a company they are and my dealings with them have left me feeling that there should be much more stringent rules and regulations governing how airlines operate, I can\342\200\231t think of any other business where you could change what you are selling to a customer and not be liable to pay them back in full immediately. If you have any other options for flights to any destination in the world then I would strongly recommend you take them as this company does not care for its customers in any way and will offer no help of something goes wrong with your travel plans. Words are really not strong enough to describe what a terribly run organisation this is.
## 326 I have flown Ryanair 20+ times and generally felt I got what I paid for. Never again unless there is absolutely no alternative. My May 12 flight to Murcia was cancelled on April 27 (as expected). I immediately requested refund which was acknowledged saying processing within 20 working days and in my bank 5-7 working days later. It\342\200\231s now August 23 and my money is still in Ryanair\342\200\231s bank. It is impossible to talk to customer service, I\342\200\231ve never had a reply from their online chat service (once ignored for 27 hours before I needed to use computer for something else) and the website is full lies. By contrast Jet 2 paid out promptly for a cancelled March flight. During lockdown I have made 4 flight bookings for holidays in 2o21 (ever hopeful), not one with Ryanair. Their arrogance is stunning and if they think this customer is going to forget they are wrong. They are now the airline of last resort.
## 327 Ryanair has been the worst in dealing with the fallout of the COVID-19 pandemic. I booked a flight for 3 May, and still haven't received a refund on 21 August. I get that the pandemic is hugely disrupting but other airlines are doing so much better in quickly refunding canceled flights. I haven't even heard from them since the initial email about canceling my flight. There is an update on their website about how they are doing with their cancellation backlog but it's clearly bogus. It hasn't been updated since it's creation and the things it states are untrue. In the beginning, Ryanair has been pushing vouchers on their customers who asked for refunds, and made it as hard as possible to contact them (it's still next to impossible). I guess this is exactly the case of getting what you pay for. Sure Ryanair is cheap but you have to deal with things like this. The seats are tiny. Last time the lady checking boarding passes and passports had the enthusiasm and courtesy of an off day part-time student worker. I have never been on any Ryanair flight that had Wifi.
## 328 The whole "possibility to change flight due to corona" for free is a scam. In total 4 flights I purchased. 1. the first flight was cancelled, I made a claim for a refund- they got back to me after a week with a voucher instead of money return and made it impossible and difficult to get my money back, eventually I had to give up and accept the voucher. The second flight I could not change for free, I could not make decision in less than 7 days prior to flying so I missed the "free change option" - did not fly. The other two flights were purchased together and because of that I just could not make change only to one of the flight, only to both of them. So I did not make a change, did not fly. Totally disappointing experience. You might have gotten my 100 eur of my flights this time but you just lost a customer. Great example how not approach customers.
## 329 What I like about this company is the fact flight attendants are friendly and professional while maintaining good prices. Have used them to Ponta Delgada, Rome and now Lourdes. Never had bad experiendes.
## 330 Both flights were canceled 2 weeks before departure, they promised to return the money within 1 month (I have received an official confirmation) More than 3 months have passed, the promise has not been fulfilled. The CEO does not respond to address emails, the customer service sends me to the robot. A complete disgrace, disrespect for the client!
## 331 Flying from Dublin to Brussels on August 10th, I received a text the night before to register with the Belgian government who track people travelling to control Covid-19. I forgot to fill it in and did it on the spot. I struggled to get confirmation cause the staff made me panic, telling me it was my fault. Eventually they rejected my entry in the plane and cost me to re book for almost 300 euros.
## 332 As of June 2020 you can simply add 55 EUR to the price of a one-way flight of you itinerary that is operated by Ryanair. If you don't check-in online, you have to pay for the check-in in the airport. It is there in the conditions, so no surprise. But if you google something like "ryanair error check in" there are quite many people complaining about not being able to check-in online. Though there are useless advice like trying other browser and clearing browser cookies. I had seats purchased, so theoretically I was able to check-in 60 days in advance. I tried it a week in advance, several days in advance, less that 2 days but more than 24 hours in advance. Never worked. You just fill all the check-in data in the account/booking, click next and nothing happens. In the browser console network tab you can see a 500 HTTP status return for the request made when you click "next". It usually means that the web service encountered an unexpected error, but of course only people that have access to the system can figure out why the error happened. User interface of Ryanair web application doesn't report any problem whatsoever, just does nothing. After not being able to check-in online, had to pay 55 EUR in the airport. Filed a complaint online on Ryanair site, no answer for more than a month, and I don't expect any.
## 333 So Ryanair says you can change your flight for free but actually you can\342\200\231t because the online management tool adds this on. I\342\200\231ve spent three whole days in a queue to try to get this amended but nobody on the web chat is acknowledging me or answering my query. If I spend three day on hold via the number they say to call costing 13p a minute. It would pay for a new return flight. My flight is on 5/8/20 so I am going to lose my money even those they are in breach of their own terms and conditions. I travel regularly with them but customer service is shocking.
## 334 Was due to have a return flight with Ryanair from Lanzarote on 22nd April, like everyone my flight was cancelled due to COVID 19. My outward flight was with Jet 2 who rang me three days before my flight was due. Apologised for the inconvenience and promptly refunded my money in full ( brilliant service). Ryanair on the other hand tried to fob me off with a voucher, but in small print at the end reluctantly offered a refund. I filled in the form and sent it off. I waited and waited. Then on the 30th July I received an email from them offering me a voucher and once again right at the end in small print I could have a refund if I filled a form in again (this had a familiar ring to it.) I am of course still waiting. Never have I experienced such appalling customer service, how they remain in business is beyond me. Like many others I will of course never fly with this airline again. I can only think sooner or later they will go out of business, they certainly will be no loss!
## 335 My flight was cancelled due to Covid 19 and I claimed a refund. Ryanair advised that I would get a refund but would have to wait as there were a lot of claims. They sent a voucher three months later (expires in 12 months) and it is now impossible to contact them.
## 336 Excellent all round. After being badly let down by their major competitor I reluctantly took the very early morning flight. Easy on time boarding, friendly and attentive cabin crew and a chirpy pilot. Plane very clean and fresh. Crew ensured masks Worn and policed toilet visits really well. On time landing and easy disembarkation. Well done.
## 337 Just flown Dublin to Dalaman. Flight was 100% satisfactory. On time and very attentive crew. Plane was clean and bright. Decent legroom and cheaper than any other carrier. Well done Ryanair.
## 338 We arrived at the airport and had paid for fast track only to be told there was no fast track open and it had been closed for some time, when I complained at the airport I was told to take it up with the airline. I then asked 3 different Ryanair staff who advised me to complain saying Ryanair should know it was closed. I tried complaining but there was no specific question which was appropriate on the chat line, it kept taking me back to the beginning. I am still waiting for various refunds on flights for March and May. I tried changing one flight which I booked in July because I was told there was no charge, again just before I was about to pay for the new flight a charge popped up. There was no way I could delete the charge therefore I gave up. I just find all this very frustrating.
## 339 Lisbon to Ponta Delgada. Impressive cabin crew, going beyond their duty, professional, kind and attentive. The flight though was tiring and Ryanair needs to stop with this sort of joke of them of landing hardly.
## 340 Very poor customer service, pre booked way before covid -19 for European holiday. All other bookings are getting refunded or credit note for full amount but not Ryanair. Was told not there problem if i dont make it to the gate, what a joke. I cant even get out of my state in Queensland Australia let alone out of the country. They are just ripping people blind for no reason.
## 341 Ryanair cancelled my ticket on the 8th March because of covid-19 from Luton to Tenerife South which is acceptable. I asked for a full refund on the 20th March they write me that it will take longer to get my money back. Now all Im waiting almost 10 weeks. I call the service they told me just wait or choose a new flight. I don't want a new flight. I think they play with not just me but everyone in the same situation to keep our money.
## 342 In a word, terrible. Do not fly with this airline! Like many, Covid 19 struck, still waiting for refund, flight was on the 9th April 2020 - it was cancelled a few days before so I submitted the refund form (kept crashing but did it finally). I hear nothing, I ring and after a 45 mins wait, I\342\200\231m told It will be processed in 14 days - lies! I get a voucher, being front line emergency services a voucher is no good, I have leave embargos in place but the airline does not care. Most of refund is baggage space I booked and obviously didn\342\200\231t use so they lose no money really. I have continued to call and email, I never get through to them, no closer to my refund and it\342\200\231s now been well over a month. How is it allowed?!? I never want to use them again. I appreciate a delay in process but Jet2 refunded in 14 days for my other trip and were really helpful. It\342\200\231s ridiculous now and how no one is stepping in, it\342\200\231s clearly not getting processed - stay away from this airline!
## 343 Flight cancelled by Ryanair, like everyone when I received the mail a voucher was offered as was a refund. I took the refund option and was then sent a voucher and told that if I wanted a refund I needed to reapply and that it would be processed after the CV-19 was over. I still reapplied and have now received a mail saying "As per interpretive guidelines on EU passenger rights, announced by the EU commission on cancellations caused due to COVID 19, this is now classified as an extraordinary circumstance and compensation does not apply under EU261/2004." In other words no refund this is absolutely disgusting. Never again will I be flying Ryanair!
## 344 I'm still waiting for my refund cause my flight has been canceled due to corona. They try to give me a voucher and it is not possible to contact them. This is unacceptable. Please do something.
## 345 Ryanair has the worst customer support ever. My flight was cancelled, and I was given the option to change my flight or receive a refund. As I need to go back to London, I decided not to request a refund and get another flight later on. Now that I'm trying to do so, they are asking me to pay the difference, they are ignoring my chats and phone calls and for 4 hours now I'm still unable to reach them. They have disconnected the chat twice now on their end, and before doing so they sent me messages pretending like I wasn't responding to their questions. Unbelievably useless.
## 346 Arrived 14th march on Tenerife with Transavia. When we left from Rotterdam airport Tenerife was marked green as destination. When we landed it had changed to yellow. One day later the lockdown went in. Started searching for a flight back from that moment, only flights with stops at Madrid were possible. That seemed a greater risk than staying on Tenerife. Finally on Tuesday 17h booked a flight with Ryanair for Wednesday to Brussels, for \342\202\2541700 (4 persons) At checking in it turned out it was not possible to reserve a seat. Wednesday at the airport we were treated like cattle at a far to busy gate. Afters hours in the line we got the message the plane was full. They overbooked 30-40 persons. At the Ryanair counter at the airport the employee told me she had arranged the refund claim. The other day we got a flight with Transavia to Eindhoven \342\202\2541500. The Ryanair refund page doesn't accept my claim because the flight wasn't canceled. No indeed, it was not, they overbooked it! I sent Ryanair a registered letter to pay me back within one month. I have not got any reaction. Never, I will fly Ryanair again!
## 347 Beware of buying gift vouchers from Ryanair. Firstly, you might as well pay cash or credit card. Secondly, no matter what the emergency, they will not extend the expiry date, or exchange gift vouchers. This includes any situation where they stop services. So if they cancel flights for something like corona virus, so you can't use your vouchers to fly, they will just let your vouchers expire and keep your cash. Thirdly They are a heartless, money grabbing, cheapskate, thieving company. Not saying don't use them, just don't expect them to honour promises and don't under any circumstances, buy their gift vouchers.
## 348 I asked for a refund as the flight was cancelled and they offered me a voucher instead. Now I am waiting for more than 2 hours for someone to have the decency to answer the chat and give me the opportunity to ask for my money back. I can understand the voucher scheme, but nobody to answer the chat, that`s simply unacceptable, this is not a way to treat a customer. Shame on you, the worst customer service ever.
## 349 Ryanair are generally disappointing to fly with, from the start the booking process (hidden charges) right up until the landing where even cabin crew appear angry with "The Ryanair way". I understand you get what you pay for with a low cost airline and expectations have to be managed but, with Ryanair, the only realistic expectation is they are going to try and take as much money from their customers as possible while providing the lowest of standards. I mean this in terms of quality of service, customer care and even cabin crew attitudes. All bottom of the barrel low. Trying to get a refund from Ryanair is a laughable offence. It appears customers are comedians and we are merely entertaining the customer service team requesting a refund. Covid and cancelled flights are no exception in this matter. Previously paid flights is an opportunity to grab tighter to the wallets Ryanir greedily grips so tightly. They are equivalent to pickpockets on the street.
## 350 I traveled with Ryanair for the New Year holidays, from Rome Ciampino to Budapest and back. Although the service is certainly not impeccable, it has always allowed me to fly at low prices. I have never been delayed or waited too long for check-in, the seats are not the best in comfort but they are not bad either. The only flaw is that concerning hand baggage, in the past it was more convenient because a hand baggage was free, but now you need to pay. However, I consider myself quite satisfied.
## 351 Ryanair have shown themselves to be outright liars trading fraudulently. Cancelled trip for early April with Ryanair and kept screengrabs during all of the Ryanair cancellation process done online. At the end the closing page stated "your refund request will be processed within working 7 days to the original form of payment and should show in your account within the next 5-7 working days. A confirmation will be sent to the address provided in your booking." Fast forward nearly 1 month and an email from Ryanair appears which states "Please see below details of your travel voucher". It is not possible to again seek the refund online through Ryanair website. Contact their telephone service and after many menu options, the call is cut off on each occasion. Having previously supported Ryanair, I intend to recover the promised refund but to never travel with them again. I hope that other Ryanair customers caught by their tricks also decide to avoid and boycott them forever after such treatment.
## 352 Eindhoven to Stansted in December 2019. Ryanair punishes heavily if you make only one infringement, from bag size to check-in time to names on the ticket. After Ryanair cancelled my flight I was pointed to a non-functioning email address, told I did not qualify for compensation, and ignored on the working communication channels when I finally found them.
## 353 Marrakech to Gatwick. A huge thank you to Ryanair for changing a scheduled flight into a rescue one. Without you my husband and I might not have made it home in these troubled times. Understand the frustration of passengers waiting on board for over 3 hours for us but the staff definitely didn't deserve that frustration directed at them. Sad to say as an Australian I had never heard of Ryanair before this flight but believe they are a low cost airline. We have our own and hear complaints about them all the time If we have the ability and funds to travel then we should just enjoy the destination or pay for what we think we deserve. Otherwise stay home. I will be for the foreseeable future but looking forward to get out and seeing the world again.
## 354 After reading horror stories of problems getting a refund from Ryanair, I would like to praise them for an efficient system. Was booked to travel April 5th, received cancellation email, and after going online to Ryanair website, the refund process took me approx 5 seconds and all went through. Not received the money yet of course, by their system is way, way better than British Airways. BA offer refunds but if you do cancellation online they refuse the refund and only offer you a future travel voucher - and you can only get a refund by sitting on their customer service phone line for 2-3 hours. I know which airline is looking after it's customer better and that is Ryanair!
## 355 Riga to Dublin. My flight had been cancelled and I was offered to get a refund. Trying to submit a form for my refund I was rejected several times due to invalid Reservation Number (wich was OK actually). Trying to chat to Customer support team I waited over 2 hours in the queue and still did not get through. Similar situation is with calling them. The airline is cheap but once you need to speak to them seems they do not really want to help you.
## 356 Shannon to London Gatwick. Nice cabin crew but very garish cabin it's like your trapped in bright yellow for an hour. Seats are okay I suppose the thing is it gets you from A to B
## 357 Copenhagen to Cologne. The story begins about a few days ago when I first received an email saying my flights are cancelled and I have to either choose the refund route or change the date of my flights. However, it has been now a solid a few days that I am trying to refund my money and the website is not responding. I tried to reach them but it seems they intentionally blocked all ways to avoid refund. The phone lines are always busy and the website's chat bot only responds to standard FAQ questions. Literally nothing works and it is very obvious that they are doing it intentionally. I can really tell this because I have been trying any possible ways for at least 3 consecutive days. This is a rip off, this is robbery.
## 358 I had my flight cancelled with another company, but Ryanair had one to a similar destination in one hour. A ticket officer refused to sell tickets to this flight just because the system wouldn\342\200\231t let them to do it. However it was an emergency situation as borders where closing soon, so I believe the worker must have done something if there were spare seats. Awful customer service! I would like to review the company based on a flight, but they didn\342\200\231t even let me.
## 359 My flight to Germany in April has as expected been cancelled which is totally understandable. Ryanair was the easiest airline to use although I tend to avoid them if possible. Their website takes you to their refund application form and details you need to enter is the flight number and the booking reference. I tried sending the form several times but the unique booking reference number was not recognised. I have tried phoning the customer support numbers on their website, the first was out of service and the other two I was told they were busy and was cut off. So unless I write to them its likely I will not get my money back.
## 360 Manchester to Prague. I was expecting a lot worse with the reviews I had seen. Honestly, no problems whatsoever. I had already checked in a month before so I didn\342\200\231t have to fuss with checking in. I went to my gate and around 10 mins later they started boarding. We didn\342\200\231t have to wait outside in the cold like many reviews said, we waited inside until they were ready. Attendants were polite as far as I could tell. Flight was a bit turbulent on take off, but turbulence is normal, apart from that it was such a smooth flight. on landing, they provided buses at prague airport to take us to the doors. Overall I am very pleased with my experience with Ryanair.
## 361 Bologna to Berlin. I have never been so disgusted by an airline like Ryanair. Due to corona virus in Italy things got a bit crazy, Bologna airport was overcrowded and security lines very slow. It took me 1h and 40 minutes to go through the security and I am sure it could have been even longer if I didn't put pressure to hurry up. Anyway, Ryanair didn't warn that lines were longer than usual and didn't make any announcement telling that the boarding was opening or that the boarding was closing. The gate was closed 18/20 minutes before flight departure (it is stated in their rule that this can happen, but I never experienced that). My question is can it be that in a very difficult moment such as the one in which Italy is, Ryanair decides to be even more strict and careless for his customer? I really have no words to describe how disappointed I was and how disgusted my such poor behaviour of this flight company. On top of this the employees at the desk were very rude and aggressive. At a certain point the employee even told you want to fly with cheap money that's the service you get.
## 362 Eindhoven to Porto. They charge you for everything, you need to pay extra 25\342\202\254 for a bag that other companies let for free so if you thing they are cheap, that not so true. Rude staff and very uncomfortable flight
## 363 Thessaloniki to Stansted. Its ridiculous how small is the cabin bag size allowed. I had to pay 25\342\202\254 because my bag wheels was not fitting in. This is my last time traveling with this company.
## 364 London Stansted to Warsaw with Ryanair. Charged extra because bag had wheels despite being in wight limit, employee rolled eyes and said "It's Ryanair you have to pay for everything". The plane was horrible and the entire experience was disgraceful.
## 365 Copenhagen to Dublin. Normal flight. However penny pinching by Ryanair. Lucky I travel with nothing but my passport and wallet. Otherwise with the \342\200\234extras\342\200\235 I would have paid double my fare. An atrocious airline which I would dissuade anyone from traveling with. A disgusting display in the broader EU market of flight fare. I\342\200\231ve flown cheaper from England via a transfer than I have direct from Dublin. An absolute disgrace to call this an Irish service as a proud wexford man.
## 366 After a slight delay in departure and an incredibly long day of frustration after frustration, we finally boarded the plane. My heart sank when I saw my phone battery at 10%. I searched for a charging port at the seat, unfortunately nothing (drawback of having such well priced tickets). I asked a flight attendant if there was a charger at the back but he told me there wasn\342\200\231t any. However, he came back a minute later to offer me his personal charger. That\342\200\231s what I consider going above and beyond. He had no reason to offer his personal belongings to a customer but he did it anyway. Ryanair, keep up the good work and take care of your incredible staff! Couldn\342\200\231t be more happy!
## 367 I have booked my flight that was not a direct one. I booked on an intermediary website. I see on my ticket that I can take to the cabin a 9kg luggage. Two hours before my flight I was finally able to download my boarding pass, that\342\200\231s when I discover I don\342\200\231t have a carry on and should pay 25\342\202\254 for it and with a transit this means 50\342\202\254 which was the price of the ticket. I had no choice and the staff are the worst ever, the plane is noisy with staff passing by selling stuff constantly. They forced me to leave my luggage aside at the boarding gate and couldn\342\200\231t take it with me in the cabin. I couldn\342\200\231t edit my reservation on the ryanair app and make it a "priority" one because they were asking for the email address and I booked through a website. Why couldn\342\200\231t I just enter my last name with the reservation number? Worst treatment for its customers by far, worst ever. Plus they charge people big amounts of money if they show up at the gate with no boarding pass. A few years back I had a different story with them and still forgave them and booked from them, never again.
## 368 Krakow to Edinburgh. Money making company. Not only do you pay expensive flight fairs you also have to pay for the bare minimum such as sitting next to someone on the flight. It is a kick in the teeth to see there are many seats left next to each other yet you've still got to pay an extra \302\24313 to sit beside each other. It is quite clear they treat non-priority customers very different, staff were rude telling customers to get out of the priority line and 'stand over there', another staff member inspecting all the small bags. I will never fly with this company ever again.
## 369 I arrived to the airport in Rome, Ciampino and stood in line for the check in 1.5 hours before the boarding time. I was supposed to check in my luggage since I had also a small backpack and Ryanair policies do not allow the carry on of two pieces of luggage on board (the check in of this second bag was included in the ticket that I bought). While I was waiting in line (there were 50 people before me) the check in for Eindhoven suddenly closed without any announcements and I was not able to check in my extra luggage. The Ryanair lady at the counter told me that there was nothing that could be done, she told me to try and go directly to the gate and ask to make an exception so that I can bring my luggage onboard since it was a hand luggage and the check in closed without any warnings or announcements. When I arrived to the gate, another Ryanair lady told me that exceptions can not be made since internal policies obligate you to check in extra pieces of hand luggage. I tried to told her what happened but I had to pay a fee of EUR 25,00 and was not able to take the baggage on board. I was forced to hand it in before entering the plane and that was the last time I saw it being placed into the airplane hold without any damage, being perfectly intact. When I arrived to Eindhoven my luggage was returned through the luggage belt, and it was completely torn apart. I went to the damaged luggage counter to ask how to proceed since Ryanair was responsible for destroying my luggage! The lady at the counter told me that I had to fill in a complaint and then go to the Ryanair website and ask for a refund. I did everything as needed, including going to the police bureau at the airport in Eindhoven. Ryanair told me that they could not do anything about what happened except refunding me with EUR 20,00. The reason why they could not do anything about it was that, since I could not hand in the receipt of my luggage - bought some years ago - they could not make sure how much the luggage was worth, why and how on earth should one keep the receipt of a luggage that was bought years before? Ryanair does not care about its customers, neither did they in the past, nor will they in the future! If you book with Ryanair you basically pay to be treated like a beast in a cattle truck.
## 370 Cork to Malaga. Everything went smoothly and perfectly. Lovely professional and courteous staff. Kind, helpful, friendly and beautifully presented. Fantastic flight, no delays and smoothest landing ever. Price of flight was brilliant too - cheaper than the taxi fare from airport.
## 371 Berlin to Kerry. Ryanair has some good deals, to be sure. But do not make even a single mistake or you will pay through the nose for it. The worst, in my opinion, is if you add a child later to your booking. You cannot simply add the child, as this would be logical. Instead, you have to book a separate adult far, all the "pay per minute" line to speak to someone, then pay an extra 30 euro "link fee." The only other option is to discard your original tickets and start from scratch. Don't let your carry ons be even a millimeter over the size limit or you'll be hit by a hefty fee. I get this is their business model, but it's a model that leave fliers hating the airline.
## 372 The only way to get from Krakow to Venice or close by is to fly with Ryanair, which is usually not my first choice, but I have to be honest that this time, maybe by going with no expectations I was very satisfied. E flew out on time and the aircraft was very clean and spacious, it was a B737-900, I think not -800 or at least it was renewed. We took the bus until the plane and boarded from back door. There\302\264s not a lot comment more about the flight as basically this 2h flight I didn\302\264t consume any type of food or beverage\342\200\231s products and neither bought anything from the in-flight duty free. Overall, by not having expectations the flight went definitely very well.
## 373 Rome-Ciampino to Dublin. Very good flight with Ryanair. Priority Gate boarding seamless but then held outside in bus for 10-15 minutes whilst arriving aircraft was disembarked at another location and cleaned. Eventually brought to aircraft and briefly held again on bus until cabin crew were ready to board us. Excellent crew, very friendly, hardworking and efficient for a full flight. Some storage of bags issues were quickly dealt with. The 9pm scheduled flight departed at 9.12pm and we arrived in Dublin ahead of our scheduled 11.15pm time. The onboard crew were engaging, accommodating, prompt and worked extremely hard (particularly the two lads) on a very busy cabin service. A lot of items sold out on the outbound flight but crew were able to give great alternatives. Landing was a little hard but it was very windy in Dublin last night. All in all I was encouraged by this flight and service. I\342\200\231m a reluctant Ryanair customer but based on this I would definitely choose to fly with them again.
## 374 Gatwick to Dublin. Extremely upsetting after using Ryanair for last few years to now having no choice but not to fly with them, rude staff. Would never use them again.
## 375 Budapest to Stansted. So even if you have time to check in online (like getting to the airport 2 hours before, they will not let you know), they will direct to their service check-in somewhere else, and there they will charge you more than the ticket to check-in for a boarding pass. You have the time but they will direct you to the office to check-in with their own office. Never will I use Ryanair again.
## 376 Budapest to Lisbon. Last weekend was the first and last time I've ever flown on Ryanair. In a 4 hour flight, where I would've normally slept through the entire flight, I couldn't sleep for more than 10 minutes straight because various carts - with food, perfumes and various other items for sell - were passing every 15 minutes, and because of constant announcements made by the crew. When I complained to my boyfriend, a fight attendant told me, very rudely 'ma'am this is the walking cabin, it's normal for the crew to be walking up and down with carts'. Maybe in Ryanair this is normal, but certainly not in other companies. When I arrived to Portugal, it took more than an hour - 1 hour and 12 minutes to be precise - for the bags from this flight to start to arrive. Two other fights that arrived much later already had their bags delivered on our mat, while we were still waiting. When asking Ryanair employees about what was going on with our bags, they said they couldn't help us or give us any information, as they didn't know. All in all it was the worst flight of my life, and I advise anyone to spend the 20 extra euros and fly on a better company. Even other low costs such as Easy Jet are far, far better.
## 377 Stansted to Seville. Worst airline ever. Charged \302\243110 just to check-in. Apparently you have to check in 2 hours before boarding otherwise they will charge you extra money. Upon asking what is the rational behind this 'policy', I was told there is none. This airline is Unprofessional and lack morality.
## 378 Bologna to Cologne. Just awful, boarding started on time but they let the people wait in the corridor for about 30 minutes before they could actually enter the aircraft. Boarding took very long and you couldn't change your seat, which was very uncomfy and didn't felt right sitting in. Staff was ok but not allow to change seats. During the flight there were lots announcements about buying which really annoyed. Deboarding was also very slow.
## 379 Malaga to London. Amazing service despite severe weather conditions. After the flight was diverted to Manchester due to unpredictable weather, the airline organized bus shuttle service from Manchester to London immediately. The pilot and the flight attendants were working overtime did adorable work to make sure everything went smooth and relax. Huge thanks for such a service!
## 380 Stansted to Fuerteventura. After all the stick this airline gets I can only say that after leaving my purse on the plane the staff at the airport were brilliant. They rang around and after 30 minutes my purse was returned. Had I lost it my holiday would have been ruined. Thank you Ryanair ... you went above and beyond .. much appreciated.
## 381 Jasionka to Bristol. Ryanair surprised me with their service. The stewards were very well behaved, and the flight was overall pleasant. The landing was also very soft. A great flight in general.
## 382 Brussels Charleroi to Stockholm. Difficult job performed well in the eye of Storm Ciara. Stood out on the observation deck and saw plane after plane fail to land and perform fly arounds (including our own). Having landed, Ryanair only used the front door as there was genuine concern that the movable steps would be blown over. Ground staff kept their cool and managed to get a full flight loaded within half an hour of arriving. Take off was delayed by about 40 mins. Apart from the initial ascent, all things considered, it was a remarkably smooth flight. I can't understand people who say that they are not aware that you need to check in online. I am continually bombarded with emails and pop-ups in the days leading up the flight. At \342\202\25415 each way, its like option pricing.
## 383 Eindhoven to Athens. I got no email for check in online, then when i tried to check in they said it was too soon to the flight departure and i had to pay 50 euros for check in at the airport. The suitcase allowed is a tiny size and they make you pay 25 euros extra and don't let you take it on the plane. They do not care about customer satisfaction and they try to make money in that kind of way.
## 384 Sandefjord, Torp to Manchester. Ryanair usually delivers what they promise: to get you to your destination pretty much on time, no frills, no comfort and limited customer care. So also this time. Boarding acceptable, departure on time, seats somewhere between uncomfortable and terrible but service on board cannot be criticized. The crew was smiling, friendly and efficient. Service on board ok. No need for ground support, luckily. What I dont like with Ryanair is the booking process, it is cumbersome since they try all kinds of tricks to make you buy additional services to what you have already done, like extra legroom, insurance, car hire and hotels. Other low costs carriers, like Norwegian, don't bother you unnecessarily.
## 385 Barcelona to Porto. Holiday ruined again by flight being delayed by hours. But of course, they will make up for just enough to not have to pay compensation. Wish I had not booked a holiday and it hasn't even started. Most useless airline ever.
## 386 Dublin to Copenhagen. Was absolutely robbed by this airline. Had an issue checking in online the night before my flight, so my partner and I decided to get to the airport 3 hours early (we were recommended to get there 1hr early, but decided to take precautions!) just in case, as we\342\200\231d been warned that Ryanair is very picky. At this stage, I should also mention that my partner and I are only travelling with Carry-On backpacks (no bags to check in - this has been fine on every other airline we\342\200\231ve used during our 6 week holiday). We arrived at the desk only to be rudely told that checking in at the desk will cost us \342\202\25455 each, and no, there was nothing they would do about that despite my issue with their website. And then the clerk eyed our backpacks and told us to go check those in as well. I\342\200\231d already checked the pricing of baggage for the airline (some budget flights ask you to pay for carry-on, but I had found Ryanair only charges \342\202\25410-20 for check in baggage and nothing for small carry-on). The cost for each bag to go under the plane? \342\202\25440 each. That\342\200\231s almost \342\202\254200, just to get on the plane! That\342\200\231s more expensive than my flight was to start with! Absolutely no customer care, let alone a shred of politeness or empathy. Nobody considered listening to our problem or even explaining why it had to be this way, and instead waved us away like we were being unreasonable for being shocked and upset by losing an unexpected \342\202\254200. I\342\200\231ll not fly with Ryanair again, and would advise any and all people hunting for budget flights to choose Easyjet instead. I\342\200\231ve had great experiences with them in the airport, and even the flight attendants and planes themselves are much, much nicer than Ryanair.
## 387 Alicante to London Stansted. We flew from London on a quick weekend get away. Our flight to Alicante was okay, however coming back was hell. Alicante Airpor was shut and our airline neglected to even offer us a courtesy call or email. We had already checked out of our hotel with two disabled friends (one with Crohn\342\200\231s disease and other with scoliosis) having made our way half way to the airport. We called them as a result of local gossip from the cab guy and it was only then we recurved support. We spent a further 2 hours trying to assitain what their plan B was. After much frustration they offer a flight two hours away from our current destination at the time when the flight was set to leave at 5 and had the cheek to tell us that if we don\342\200\231t make it there\342\200\231s nothing they can do. They didn\342\200\231t even offer transfers having expressed to them that all surrounding fares have either doubled as locals were aware of the chaos and or public transport coaches and trains left at timing that would miss the flight. They even told us not to get into a cab that we informed them would charge us extortion rates. In the end we paid \302\243400 for two cabs to take our group to the airport. As we rushed into the airport there were no Ryanair representatives for support, people waited around without refreshments or information for hours before anyone appeared to board us. When we were finally on this alternative flight we waited a further 1 hr as they proceeded to act like a passenger was missing. A deploy scam to ensure they suggest the flight took off exactly under the 3 hour delay protocol for compensation. I\342\200\231m fuming and it ruined our enjoyable. Just horrible. Please save yourself the anxiety and travel with someone else.
## 388 London Stansted to Bari with Ryanair. A good all round experience at a good price. I had 2 email reminders about my baggage allowance and checkin for which I used the app. Boarding a bit slow and a long wait outdoors in the cold. Flight on time and arrived early. All crew pleasant enough. Seats are ok for a 2.5 hour flight. Nothing really to grumble about. Follow the simple rules and this airline is fine.
## 389 Malta to Catania. I had an accident and broke my leg. Due to this issue, I had to cancel three trips I had scheduled with three different airlines, Alitalia, Volotea, and Ryanair. Everything went well with Alitalia and Volotea, even though my flights with them were not reimbursable. Only Ryanair has not accepted to refund my tickets, even though on its website it states it "may reimburse tickets in case of serious illness of the passenger". Most probably a broken leg is not serious enough for this airline.
## 390 I have flown Ryanair many times in the past. I find the service excellent. They get you from A to B on time, efficiently and affordably. I have never had an issue despite travelling with Ryanair more than twenty times a year for more than twenty years. They are the number one airline in my opinion for selling you exactly what you want, in terms of priority boarding, priority seats, luggage options, etc. If you want something, you can pay for it. If you don't want something, don't pay for it. Simple enough. You can check in weeks before your flight, which means that you can print out both boarding passes at home. A lot more reasonable than airlines that make you wait until 24 hours before the flight (why?!) Most of the people I hear complaining about Ryanair don't follow the rules and then blame the airline for their own mistakes or oversights. On my most recent flight, the plane left on time and arrived on time and the staff were courteous and friendly. Nothing there not to like. Highly recommended!
## 391 Sofia to Einhoven. Staff in Airport very not friendly. Baggage policy unclear, website very misleading, amount of peoples in one bus to plane is too much. Waiting times are too long for everything
## 392 Faro to Berlin. Worst airline I\342\200\231ve ever used. Even worse than Spirit and that\342\200\231s saying something. Flight attendants were entitled and rude. The entire process was beyond inefficient. Had to show our boarding passes a total of 5 times. There wasn\342\200\231t a seating area available for the gate until after our boarding passes were scanned, and no workers would scan the boarding passes until the boarding time so most people had to inconveniently stand for over an hour. Our flight was 3.5 hours and the airline refused to even provide water unless you paid! What kind of service is that? I\342\200\231ve never experienced an airline that wouldn\342\200\231t provide any beverage during that length of duration. Absolutely absurd. Yet the flight attendants went around trying to sell cologne and perfume. What a joke. I will never fly with this airline again.
## 393 Alicante to Leeds. They may look cheap however they are more expensive with all the hidden extras! The cabin is dirty and the planes are the furthest away from the airport terminal. I can only imagine this is because they get it cheaper to park further away in each airport. Disgusting attitude from ground staff and unpleasant cabin crew, mostly from Europe with no customer service skills.
## 394 Absolutely disgusting airline who actively rip off their passenger. Flew from Manchester to Tenerife, ok wasn't the best flight with very few services and clearly overworked staff who weren't very friendly and had that couldn't be bothered attitude, I expected that on a budget flight. I object to paying the extortionate charges for luggage so I just booked hand luggage. No problem at Manchester but flying back from Tenerife, they decided to charge me 25 euros for the privilege. Absolute rip off and a total disgrace where they know you have no option other than to pay it. Legal thieves. I will never fly Ryanair again and would advise anyone traveling to use Jet2 instead.
## 395 Leeds Bradford to Riga. Yesterday I was denied boarding 32 minutes before the flight was due to depart, they closed the gate 2 minutes earlier than what was printed on my boarding card, I could see people still boarding they could of got me on the flight but could not be bothered to even try. The gate staff couldn\342\200\231t of cared less and were rude and unhelpful. Lesson learnt I will never fly with Ryanair again!
## 396 I flew EDI/AGP on 13/01/2020. I really don't understand why people leave such negative reviews. Flight was on time the AGP based crew gave a fantastic onboard service which many legacy carriers could learn from. All of them were polite friendly and nothing was too much trouble. Would not hesitate to use Ryanair in the future.
## 397 This is a review of the service not the actual flight which I was unable to take. I was probably one of the most critical person regarding RyanAir, silently never putting finger to email. The reason of the review is to praise the airline for their prompt action. We were due to fly in December 2019 but in October my wife was diagnosed with a terminal illness, once we had her discharge notes from the hospital I sent the necessary claim form and discharge papers telling RyanAir she couldn\342\200\231t travel. These were sent off at about 1800 on Friday and Saturday I received an email from them confirming a FULL refund, no deductions. I thank the airline from the bottom of my heart.
## 398 Barcelona to Seville. Worst experience ever. Staff are not aware of baggage rules, unbelievably rude, and wow, so slow. Checking in bags was extremely difficult and expensive. Every flight attendant we talked to mentioned different prices for my bags. I fly very often and this was my worst experience ever. I will never use Ryanair ever again.
## 399 Liverpool to Derry. A shocking airline. Don't put yourself through booking with them. They seem cheap but charge for everything. You can't even bring a carry on anymore, it has to be a small bag. Staff aren't that friendly, uncomfortable seats (would hate to be on a longer flight with them!). I am done with them. I will be taking my custom elsewhere
## 400 Madrid to Dublin. A terrible experience with Ryanair. We are queuing to board and Ryanair employee comes over to tag our buggy (traveling with our toddler) she checks the ticket and sees that we do not have priority boarding so she tells me I have to pay to the wheels bag (normal carry on bag). I told her it was paid for already but we did not have time to leave it at the check in desk. She said I need to pay 25 euros, I asked if it goes in the same place as the buggy and the rest of the bags and she said yes it goes in the hold. I paid for the bag already why are you making me pay another 25 euro? I leave it at the airplane door with the buggy? Really does nobody check this company\342\200\231s rules?
## 401 Lisbon to Malaga. I am extremely upset about the way we were made to pay an extra 330 euros for my family of 6 to fly because we were not checked in online and the reason we weren\342\200\231t checked in was because their website wasn\342\200\231t working for us. We kept trying and the system kept freezing. When I questioned this I was told you should have called us. We may have even made their 2 hour cutoff if we hadn\342\200\231t stood in really long lines. We will not be flying with them again.
## 402 We were supposed to flight from Milan Bergamo to Dublin at 21.25pm on 13 January. Police shortage in Bergamo Airport, nobody was advised, 1 hour 30 min waiting at passport control, last call was made for flight to Dublin at 21.23, we arrived at gate at 21.30pm, the aircraft left at 21.57, leaving 60 passengers on the ground. No Airport Manager or RyanAir Rep on duty, the gate control guy tried his best to contact the aircraft and RyanAir in Dublin explaining the situation, RyanAir denied time extention. The 27 minutes delayed was due to the discharge of stranded passengers luggage off the plane. The aircraft left in front of our nose. If I didn't experience this in person I would have never believe it, the total lack of customer care and common sense was unreal.
## 403 Prague to Edinburgh. Normal low cost flight. Boarding was quite chaotic no one cared about some priority boarding etc, but they checked dimensions of almost all baggage. Departure on time, arrival too (maybe a few minutes late). Flight was operated with normal Ryanair 737-800, 12 years old, reg. EI-DYA. Interior wasn't so clean, seats looked quite old, but comfortable, at least for low cost airline, legroom was fine too. Staff were nice and friendly (one of them maybe too much). Flight cost less than 6 Euro, for this price perfect service.
## 404 Paris to Vienna. I am very upset with Ryanair because 24 hours before departure I tried to check in and when I needed to fill space with passport number their website was kicking me out, I tried few times and it didn\342\200\231t work. When I came to airport on check in they told me I have to pay 55\342\202\254. I said I couldn\342\200\231t check in on their website from apple instead of that they told me to download their app and do it from there and better from android. I will never use this airline anymore, because at the end one way ticket instead 26\342\202\254 was costing me almost 100\342\202\254 with bad service.
## 405 Ponta Delgado to Lisbon. No flight on Ryanair was on time. Besides the ticket, you need to pay for your baggage in the cabin. The cheap becomes expensive! And with delays. This airline is the worst low-cost airline!
## 406 Dublin to London Stansted. I used Ryanair only for the 2nd time (first was three years ago). When I reached airport for flight, they said you have not checked in and charged me 110 euro for I and my wife. They blocked online check-in, it was showing boarding pass expired and charged 55 euro to print boarding pass. There was no reminder email, no heads-up about the 55 euro fee. There were at least 3 more passengers in line for the same reason. They designed the process to rob new/occassional flyers.
## 407 Flew Ryanair in august 2019 from Budapest to Barcelona and return. Cabin crew pretty polite, no other services on board. The leg room on the outbound flight was horrific, better on the return flight. Departing from Budapest means walking from a garage directly to the plane, that\342\200\231s the lowest low cost I have ever seen.
## 408 Worst airline for countless reasons. 1) Flight delayed by six hours. We were scheduled to depart at 6.05pm. Everyone had boarded the aircraft by 6pm, but we were told by flight attendants to disembark due to a "technical error on the plane". The flight was rescheduled to 12 midnight, but it eventually only took off at around 1am the next day - a total of seven hours of delay. 2) Zero accountability. Ground staff were completely clueless as to any protocol in times of delay. Worse still, for the next ninety minutes or so there was no follow up action and all passengers were just stranded at the boarding gate. We were told to "come check back every 30 min or so" and there was no assurance of what would be done. 3) Shamelessly tried to shirk responsibility. We were told we could make claims via the EU261 flight regulation. However when I submitted my claim, the airline had the gall to say the flight was "delayed due to air traffic controller restrictions, which was outside of our control", which was totally opposite of the technical errors that the air crew had stated. 4) Poorest ever customer service. I followed up with Ryanair customer service staff who had zero professionalism. He was nonchalant throughout the correspondence. The incompetence of this staff member is highlighted in the fact he redirected me to the CAA UK site despite knowing my flight had departed from Spain, and that CAA does not serve cases where the flight departs from other EU member countries. Overall, I regret booking flights from a subpar company with service undeserving of any approval whatsoever. The rock-bottom standard is paralleled by its consistently plummeting stock price. I would recommend this airline to anyone who seeks disappointment, or wishes to spend the night at the airport for any abnormal reasons.
## 409 Valencia to Bristol. I had no internet access and the website had technical issues and I couldn't check-in online. I went to the counter more than 2 hours before the flight and staff said I'd have to pay 156 Euros for airport check-in. As I explained the situation, she asked me to "wait as she tries to help". And as I waited until it was 2 hours to the flight, then she came back and told me that it's past deadline now and I'd have to pay.
## 410 Eindhoven to Ibiza. I've flown at least 10 times in total with Ryanair and 200+ times with other airlines, so feel I'm able to make a decent comparison and say categorically the Ryanair is by far the worst airline I know. It's simply 'cattle class' transport, with very very little seat room, no service to mention and personnel that obviously have little pleasure working for the CEO of Ryanair. I've now sworn that I will never ever fly Ryanair again. It used to be a 'Cheap and Nasty' airline but the 'Cheap' has now largely disappeared. Charging for every small thing separately, even hand-baggage. Even a single letter change on your booking can cost 5 times the ticket price. Ryanair is airline I strongly advise not to fly with.
## 411 Our flight from Eindhoven to Lisbon got cancelled. They then sent me an email I had a right to a full refund, but when I applied for this refund, they refused. So we skipped our trip, but of course we still had a return flight. I tried to change the date on this flight to go to Lisbon later, but this turned out to be impossible. So basically, we paid 900 euros and got ripped off for the full amount: we never flew.
## 412 Bristol to Krakow. Very unhappy with service. Arrived at gate 2 minutes after closing, attendant had just closed door behind last person. Refused to to get us on board or contact anybody on plane. Understand that was also our mistake but shocked from lack of human approach.
## 413 Luton to Dublin. I have never witnessed such disgusting service in my life! An air hostess whistled at customers and shouted "oi" to get their attention. Other colleagues were not positive. Seats were highly uncomfortable and we had no leg-room. I won't be flying Ryanair again, it's obvious they have no respect for customers. I'm still disgusted.
## 414 Barcelona to Frankfurt. Flight delayed by one hour. Delay not communicated clearly, at all. Flight attendant did not care when asked about connecting transportation.
## 415 Ibiza to Madrid. Worst airline ever. Charged 134\342\202\254 from us for not doing prior check-in. No such thing was clear to me prior booking or mentioned on tickets. Won\342\200\231t book it ever in my life again.
## 416 Bucharest to Berlin. I have flown plenty of times with it, and always the same story. They sell an nonexistent service, called Priority Boarding, and advertise it as if you can actually skip waiting in the queue. What really happens is: Priority Boarding passengers get the honor of waiting first, outside (in freezing cold in winter) until pretty much everyone else, priority or not, has gone through the check-in. So basically we pay extra to have the honor of waiting outside. Fantastic, worth every cent! If you do have any respect for the customer, at least stop selling that package as priority boarding - this service does not exist. Just simply state extra luggage.
## 417 Venice to Paris. Flights cancelled due to strike in Paris. Could not offer alternative flight offered a refund. I was stranded with no notification received from Ryanair. I manage to locate alternative flights to Paris which cost me an additional \302\243278. I was advised by Ryanair and staff members if I book and locate my own flight they would refund. I have contacted Ryanair since I have returned to the UK they have denied all knowledge of this keep saying raise this with complaints department which I have and now I'm not entitled to a refund. I have been cut off with incompetent staff there is no manager ever available. Now I'm left to fork the bill.
## 418 Manchester to Venice. My girlfriend has brought me a romantic holiday to Venice, and the edge was taken from this the night before when she had to pay extra for cabin bags. When we got to the airport we found out that she had paid extra for the return flight only. (\302\24350) Then we had to pay more \302\24350 again and another \302\24320 to seat next to each other. On the plane I was asked to move to my original seat as 80kg will alter how the plane takes off. I will use Ryanair to return home and this will be the only time I will ever use them.
## 419 Brussels to Dublin. They trick in customers in more and more add on purchases. They will sit you apart and bombard you with messages to upgrade. It was last time I was flying that airline.
## 420 Stansted to Copenhagen today. Baggage services was very poor and slow followed by long security check in Stansted Airport. We arrived late to the Gate but the attendant was very rude not allowing us as there was still time for us to get on. But they had time to discharge our luggage.
## 421 Madrid to Stansted. I missed the "you gotta check in digitally" email. Was made to pay 55\342\202\254 to print boarding pass in person.
## 422 Stansted to Barcelona. I and my friend had received many emails from the Ryanair regarding our flight and emails showing you can check in now service. We tried their website and app for check in which had some problems and decided to do it at the airport. At the airport the check in desk told us that we must have checked in online, and we were asked to pay 55 GBP for check in at the airport (even more than the price of the ticket itself).
## 423 Malaga to Brussels. They deemed my daughter's hand luggage to be too big. I ended not being able to upgrade and having to pay for extra luggage. I have had it with Ryanair. The people working for this nightmare of a company are great and I am sorry for them.
## 424 Stansted to Budapest. Ryanair\342\200\231s website wouldn\342\200\231t let me check in, so we got in the bag drop queue for 30 minutes hoping to check in there, to be told we had to go to customer services. Got to customer services to be greeted by the most unhelpful women I have dealt with. She said I had to pay \302\24355 to check in as it was so close to 2 hours before the flight. I refused and said it wasn\342\200\231t my problem as the website wasn\342\200\231t working for me. Managed to sort it by myself, through the app. The worst customer service I have ever come across.
## 425 Had 3 flights within the last 2 weeks around Europe. All 3 had slight delays. The third one we booked for 4 pm departure but a few weeks befote they changed the whole flight to a 7.55pm departure. Leaving a small amount of time to pick up our rental car at manchester. The main issue however, was from lisbon to rome we were charged 55 euros each to check in at the airport, we tried the night before to check in an pay for seats together however the website kept crashing. Staff at airport were very unhelpful made us pay the 110 euros to check in and were sat at opposite ends of the plane. Have lodged formal complaints about this but no response. Furthermore, on the plane ordered a chicken panini which came still frozen inside. Overall, would not use Ryanair again. Terrible customer service.
## 426 Glasgow to Krakow. My Ryanair experience was average for a budget airline, the trip didn\342\200\231t get off to the best of starts as the plane was 15 minutes late to the gate and we boarded late as well so we were about 45 minutes late leaving, but other than that we had a decent flight with Ryanair, seats weren\342\200\231t too bad but I won\342\200\231t travel for any longer than 3 hours in them, cabin crew were nice and ground staff as well and as an added bonus we arrived in Krak\303\263w almost 1 hour early!
## 427 Ryanair from Frankfurt to Malaga, from Memmingen to Palma de Mallorca and Palma de Mallorca to Frankfurt. All flights good. Prices 16\342\202\254 for a ticket. Crew was kind. Landings are not hard, but rather firm. No food was provided. Satisfied with the airline.
## 428 Brindisi to Stansted. Very good experience. Just follow the rules and there is no hassle. Was reminded to check in well in advance and received two emails in the week before the flight reminding me of my baggage allowance. Speedy boarding is a must if you want to take a small suitcase on board as well as a \342\200\230handbag\342\200\231. Flight on time, pleasant enough crew and a good coffee. Hard sell on scratch cards and duty free but easy enough to ignore. Leg room is good as seat backs are flat. Good price ticket.
## 429 Stansted to Copenhagen. Just had the worst experience with Ryanair. The app wouldn't check in both me and my friend, and even though we tried doing it both on the website and in the app, it just wouldn't work. We even had the help desk trying to sort it, but still nothing. The. We arrived at Stansted Airport, and waited forever in the luggage que, only to be told that we had to go to the information desk. So we did, another massive line that took forever. I was told I had to pay 40 pounds as I wasn't checked in, and would have to apply for a refund myself. OK, I accepted. At this time there were 20 min to the gate would close, and as I paid I was told that now it was too late, out bags couldn't be checked in and now we would have to buy another flight the next day. So we now had to pay for another flight home the following day and a hotel to stay for the night.
## 430 Edinburgh to Nantes. They lost my luggage for the duration of my 1 week visit and only got my bag back on the way back to Edinburgh. As compensation for ruining my entire trip they offered me \302\24325 refund that I paid for booking the bags. Unbelievable.
## 431 Ryanair is the worst airline, because of all their hidden costs and porous policies from ticket purchasing, to check-in, to luggage policy. The staff at the airport is next-level rude and unhelpful. My boyfriend and I purchased our tickets about a month prior to our flight (it was a returning flight from Seville to Morocco), we arrived at the airport early enough to go through check-in and drop our bags only to be told that we have 2 minutes to check-in online when their website was not even responding for us to go through with it in addition to shaky airport Internet connection that was not helpful either. We went to see the company representative at the counter only to be received with a deaf ear. The lady tells us that we have to pay a 55 euro fee per person in addition to the luggage fine that goes up to 50 euros per person per extra luggage. When we tried to ask for a way to help us because we are literally stuck at the airport, she didn't even looked like she had the slightest bit of concern for our situation or even tried to find a way to help us, or direct us to someone that could. All she said was "you gotta take it up with customer service" when she was sitting inside the customer service booth at the airport. I know that I should've known better about Ryanair as today was NOT the first time a situation like such happened with them. I would never ever recommend this airline to anybody, you're better off paying the extra 20 or 30 euros to fly with a proper airline with an actual customer service, a real 21st century company that truly cares about their customers.
## 432 Venice to Stansted. Do not waste your time effort or money. Spend the extra 30-40 euro and get British Airways. RyanAir is literally the worse airline. Disrespectful staff, uncomfortable planes. I knew better but I didn\342\200\231t do better. Last call was called as I was literally walking thru the customs control. 1 minute later I arrive at the gate (bus was still out front) and they wouldn\342\200\231t let me board.
## 433 Essaouira to Brussels. 66\342\202\254 for Check in at the airport in Morocco. It was my first time with Ryanair, and I wasn't aware of such fees. The ground staff told me, after booking, I would have received the itinerary with such notice over the fees for Airport check in. I showed them the email with the itinerary but no such information about fees.
## 434 Athens to Santorini. We did not have a good experience with flying on Ryanair. When we landed in Athens from the US we tried to go the desk to check in for our flight to Santorini four days later. However, the airline said it was too early and we could do so later. When we arrived for our flight we were told because we missed our window to check in (48 hours to 2 hours before the flight - we were there 1 hour and 55 minutes before) we would have to pay 60 euros each. We explained that they woudn't let us check in previously and they said they had sent us an email. We were on vacation and had taken a break from media. The staff was not kind or thoughtful, they just handed us a bill for 120 euros and sent us to another desk to pay if we still wanted to make the flight we had already purchased. To say the least we were quite upset about paying double for our flights that we had booked several weeks prior. When we left Santorini we had similar problems. The desk agent asked us for printed boarding passes. When we told her we didn't have access to a printer at our Air BnB she said it would be 30 euros per person to get a boarding pass. We could not believe that we were asked once again to pay more money on top of our ticket prices just to print out a boarding pass. She was unfriendly and handed us a ticket to go pay our bill. We asked if there was some other way around this and she said that if we wanted to step out of line and download the app. that was an option. So, even though we had been in the line since early that morning we stepped out of the line and downloaded the app. even though we really did not want this app on our cell phone. What a run around. To say the least, we will not be flying this airline again. It was such a disappointment. At least if they had been friendly that would have helped.
## 435 Dublin to Berlin. Without doubt the worst airline I have ever flown with. Firstly my first flight was cancelled and this was very poorly communicated and I then had to fly from a different country. This should have started the alarm bells ringing of what lay in store. The seats were cramped, the flight attendants were clueless and the pilot must have been under supervision. The food was terrible, no ice for drinks. No room for overhead bags even though you pay extra for it.
## 436 Madrid to Bari. It wasn\342\200\231t the best experience I\342\200\231ve ever had flying on a flight, but this being Ryanair, you\342\200\231d expect that. As many Ryanair flights fly out of Madrid, it took quite a while to complete bag drop, specifically around 50 minutes. The flight was delayed by about half an hour. As a budget airline, the flight was adequate, it felt safe, wasn\342\200\231t particularly comfortable and pretty much delivered as expected... if not a little better. The seat was wider than expected, and staff were more helpful than I\342\200\231d have thought. I wasn\342\200\231t fond of the lack of a seat pocket, but it it did give me extra leg room so points to them for that. Seats are non-reclining because of course they would be and While the safety card being printed on the seatback is a clever idea to save weight and all, it\342\200\231d be nice if they calmed down a little with all the yellow. I wonder how the new \342\200\234game changer\342\200\235 seats would feel .. they look nicer, but do they also improve on comfort? I got off the 2 hour flight with a numbness that I\342\200\231ve never really felt before.
## 437 I have never had any problems flying with them. Yes they have rules, some of them ridiculous and money making but they generally have the lowest prices. I have flown legacy airlines and their short haul services are no different. The service is efficient and the staff are generally pleasant, given the pressure they are under. Today I flew from Dublin to Malaga. The flight was 30 minutes late departing. Apologies were made. The Spanish based crew were very pleasant and my panini and tea were delivered with a smile. One issue I have is not being able to hear the inflight tannoy. To all those who write here, read their rules, check in online, print your boarding passes or use their (really easy) app, book seats if you want to sit together. This is a low cost airline with great fares.
## 438 Barcelona to Rome. Not like one more bad review for this airline is going to do much since they already have so many. Just a warning that if you aren\342\200\231t able to check in online 2 hours before your flight. Even if Ryanair\342\200\231s website wasn\342\200\231t working. They charge you 55 euro to check in at the airport. A group of 6 of us all couldn\342\200\231t log into sign in online before our flights. Explaining that to the customer service clearly didn\342\200\231t matter.
## 439 Birmingham to Barcelona. Absolutely rubbish. \302\243115 to change flight names and \302\24324 to sit together - total joke would not recommend to anyone they take the mick with all these hidden costs.
## 440 Amsterdam to Dublin. Flew one time and the last. To be charged for check in 55\342\202\254 I found outrageous. First and last time I am flying with this airline.
## 441 London Stansted to Barcelona. I have taken a small cabin bag that is standard measure to any airline but Ryanair charged me GBP/Euro25 per flight because my luggage was oversized! Their reason was that it will not fit in the overhead compartment nor under the seats. However, I took the luggage inside the aircraft and fit it perfectly in the overhead compartment and under the seat and I have pictures to prove it. I think Ryanair is a money scamming airline and if I didn't have to fly for business with them, I would have not booked with them and I will not book ever with them.
## 442 Lisbon to Milan. This company commands their staff to rip you off as much as they can at the check-in counters, it\342\200\231s really unreasonable. My ticket baggage allowance was 20kg x 3 bags total 60kg. At the counter, I wanted to check in 2 bags total weight of 50kg. The short hair woman at the Lisbon airport terminal 2 counter said I had to check in one more bag or I must pay \302\243110.00 in excess baggage. Something about maximum per bag is 20kg and not more. I saw the baggage allowance policy online that you are able to pool your luggage together to make the allowed weight. But I decided to let it go and bought an empty luggage from the nearby shop for \302\243120.00 to check in at a total weight of 53kg. What\342\200\231s more, since I didn\342\200\231t print my boarding pass I had to pay an additional \302\243110.00 to check-in at the counter. Totally spent an extra of \302\243230.00 for nothing at all. Just see the number of people queuing up being coerced to pay for additional things at the Ryanair counters vs easyJet counters tells you they are an absolute rip off.
## 443 Last night, the day after my fathers funeral, I flew home from Kerry airport to Luton. Despite having flown this route numerous times over the last few weeks with the same airline approved luggage while my dad has been in Intensive Care, Ryanair chose this flight to single me out and charge \342\202\254100 for mine and my children\342\200\231s 4 bags. The member of staff was not interested in the fact I had buried my father the day before and was insensitive and rude. On boarding the aircraft, I photographed numerous bags in the overhead luggage of the same dimensions as mine, on questioning the other passengers they had not been charged any extra for this luggage. Shame on you Ryanair, you have made a distressing and emotional time 100 times more upsetting.
## 444 Bologna to Stansted. When I did the check in from the internet, I paid 25 euros for one extra suitcase. When I arrived to the airport of Bologna the staff said to me that I have to pay one more time for the same reason, because i had to leave my suitcase in the check in. I asked them that nowhere writing that if you make a mistake like that you have to pay a penalty, I don't take an answer. The worst company ever. It was my last time.
## 445 I take several times per year the Ryanair flight from Nice to Dublin since 2016 (for working reasons), so my experience is rather big and I would say statistically significant! The flight time is late in the evening, the arrival in Dublin (depending on the season) is scheduled generally after 11 pm. The flight is constantly delayed, I think only 2 or 3 times the flight left at the right time according to my experience. This has often caused me serious problems as my final destination in Ireland is not Dublin but Galway, and the last bus I can catch is at 00.30. This means that several times I had to sleep at the airport and wait for the next bus (around 5.30 am). Many times I asked the flight crew if any options were available such as hotel accommodation (at least at a special price) or alternative transportation. Last time (a month ago) they offered a 4 euros snack coupon for a 2 and half hours delay, I did not know whether to laugh at their faces or cry! Additionally the communication of such enormous delays are always made at the very last moment, making very complicated the organization of an alternative way. This company is an absolute disaster, I keep taking this flight because I simply do not have any other choice
## 446 London Stansted to Bordeaux. Hideous customer service when checking in bags. Was told I needed to pay an extra \302\24325 when checking in hand luggage even though I proved it went into the hand luggage carry. The bag was also only 6kg. When I questioned again my response was "It's a Ryanair thing" and was told I needed to pay.
## 447 Manchester to Rome Ciampino. In July 2019, I booked a city break to Rome for the two of us to celebrate. The initial flight was at 0605 hours on the Monday morning and we were to fly back on the Thursday at 1045 hours. This would give us almost three full days in Rome. A matter of weeks after I bought the trip, Ryanair changed the flight time to more than 4 hours later meaning that we did not get to Rome until late afternoon. By the time we got the bus into Rome and checked into our hotel, almost the entire day was gone meaning we only had two days in Rome. Due to the fact that this was part of a package with Expedia, I did not have much of a choice but to agree to this change. The flight was okay, with Ryanair, you get what you pay for but I resent being messed about. Poor customer service.
## 448 Seville to Marrakech. Worst airline ever! We tried to check-in online and could not. I went to the help counter and the very nice young lady there could not either, so we were scammed out of 55 Euros each for checking in at the airport. When we returned home, we protested the credit card charge. Ryanair (really Ryanunfair) responded with "no refunds" and sent documents to the credit card company supporting their position, which included a page of flight information that had nothing to do with our trip. Avoid them or pay additional costs! Ryanunfair made this one flight into three: First, Last, Only. Beware.
## 449 I will discourage everyone trying to fly with this airline. The price might be cheap but they will try to get money form everything else. I had to pay \302\24355 for check in at the airport (never happened to me before after lots of flights) and they never sent me an email (as all airlines usually do) to check in. Of course they do that intentionally so you have to do the check in at the airport and charge you for it. Also the staff are disrespectful and not professional at all. Not people you can talk to. Worst customer service. Be aware before booking with Ryanair.
## 450 Gran Canaria to Barcelona. The worst flight company in Europe. Charged 25\342\202\254 for a wheeled bag even though they don't have enough space in the airplane itself. Bigger luggage costs starts from 40\342\202\254 which is really expensive. And the seat could cost you up to 20\342\202\254 Cost of the trip: 43\342\202\254 Handbag: 25\342\202\254 Luggage : 40\342\202\254 Seat : 20 Total: 128\342\202\254 Total extras : 85 \342\202\254 This is not a low cost company as they say.
## 451 London Luton to Vilnius. I rang Ryan Air a full 14 days before my outbound flight to let them know that I would not be able to travel after all due to family/personal reasons. As I had paid for their optional 'one trip travel insurance' I told them that I would be claiming my flight costs back via the insurance policy. To cut a long story short: I was told that Ryanair has no cancellation policy and that I would have to wait for at least 24 hours after my return journey and then phone Ryanair again to request a 'Did Not Show' confirmation letter. This will form step one in the insurance claim process. As my return flight was booked for 10th November I, therefore, phoned Ryanair 12th November. They told me they will email me the necessary 'Did Not Show' letter and that I can expect this in the next 8 working days. I said that this was a ridiculously long time to wait, particularly when the customer service agent said she could see that I hadn't used the ticket and would, therefore, be instructing the DNS letter to be processed immediately. When I asked what the procedure was once I had received the DNS letter she said she did not know but was sure that instructions would be included in the email. My issues are: I informed Ryanair 24th October that I would not be using my ticket but was told that I could not start to claim back my flight costs until at least 2 days after my return flight. This meant there would be an empty seat travelling to Vilnius 7th November and an empty seat travelling back to Luton on 10th November. As Ryanair confirmed there was no way of cancelling my ticket/seat then I must assume those seats were left empty! That sounds like very bad commercial practice - not something I would expect of a low cost/budget airline. Ryanair offers 'one trip travel insurance' at the time of booking and then cannot explain the procedure for making a claim against the insurance policy. They blame it on the fact that their insurers are a 'third party'! Check! The transaction was made between me and Ryanair and I expect Ryanair to be responsible. I now have to wait possibly another 10 days simply to start the claiming process - a process which I am still in the dark about. How much longer will this take? It's only when things go wrong, or are slightly outside the norm', that the 'you get what you pay for' adage comes home to roost!
## 452 Stansted to Athens. This airline is the worst airline ever. Carry on luggage is just a small bag unless you upgrade at \302\24314 per flight for priority boarding - if you fail to check online before 2 hours prior to your flight you pay \302\24355, if you want to sit next to your friend it will cost you an extra \302\2434 each - if you have any complaints or issues with your flight, you can't talk to any Ryanair staff at the airport but instead you will talk to staff from another company. They can't really help you at all and they just keep saying you need to contact Ryanair. I will never ever use them ever again!
## 453 Munich to Dublin. Flight was less than half the cost of Aer Lingus and was super. I paid to select my own seats and took priority boarding with extra hand luggage. I was impressed with everything about this flight. Clean bright modern plane lots of leg room and pleasant staff. Good take off on time and good landing. But not impressed with marathon journey on foot from landing port to passport control. Murder on us older folk.
## 454 Bratislava to Dublin. I fly with Ryanair quite often and I've always been happy with the airline until we were coming back from Bratislava. My husband had booked rows 33a and 33b at the back of the the plane, we used the back entrance and saw that people were in our seats, we mentioned this to the air hostess and she said 'oh sorry, special assistance are sat there now so you have to go to the front of the plane to row 2'. We had to go to the front of the plane trying to pass by passengers going into their own seats, I felt so stupid saying sorry repeatedly to people and explaining to them that our back seats were taken and we didn't know till now. We dont have a problem giving up our seats to those who needed it but it's worse when you are not told before you start to board the plane. Passengers, don't book the last seats on Ryanair because they dont understand how to communicate to each other, all they had to to was make an announcement and let us know.
## 455 Toulouse to Brussels.Probably my worst flight experience. They charge you extra, their policies are really unlogical. Like paying 25\342\202\254 on a luggage you already payed. Never flying with them any more.
## 456 Lisbon to Valencia. 55\342\202\254 fee because I didn't check in online. I was at the airport 1 hour and 40 minutes before my flight. I went to the counter to check in and they tell me I need to pay a fee for not checking in online at least 2 hours before the flight. This, surely is the most unjust money grabbing ploy of all time. Horrible experience.
## 457 Venice to Barcelona. We bought 3 wrong tickets, purchased new ones and spent over 400 euros which is fine because it was our mistake. But we tried to do the check in online the night before the page kept redirecting us away from the check in. We wait in line to do the check in at the counter and after an hour of waiting in line we arrive to the counter. At the counter we are informed that we need to pay 55 euros each to be able to check in or we can\342\200\231t fly. They sent us to a different floor to a different counter where we had to wait again. The person in the counter was extremely rude! We ended up paying 165 euros to be able to get a receipt to do the line again to get our boarding passes. The customer service was terrible and a ticket that was supposed to be cheap ended up being more expensive than flying in a good airline! I do not recommend this airline to anyone.
## 458 Stansted to Tallinn. As this was a 6am flight the boarding was smooth. The plane itself was 12 years old and showing its age. Probably the oldest on the fleet. Just after we had been pushed back, the pilot explained that there had been a warning light come on. And that we had to go back to the gate for an engineer to assess. As annoying as this is, it can\342\200\231t be helped. What I will say is the pilot was excellent. He kept us in the updated constantly. After all we were only delayed by and hour.
## 459 Bournemouth to Palma. We had to pay \302\24355 per person for not checking in online. They said they sent email notification. We had priority boarding for one of us and asked them to refund some amount. But they kept sending automated replies saying we have to pay if we do not check in online after.
## 460 Rome to Vienna with Laudamotion. Ryanair is the total disaster. Nobody seems to be responsible. The staff is very unfriendly. I booked a luggage and had to pay two times. The hotline is available after 15 minutes. Then they were unable to help and just ended the call. I will never never choose this airline again.
## 461 Tel Aviv to Paphos. We didn't do online check in and we had to pay 110 euros for 2 persons. They said that they sent e-mail to inform but we didnt notice. During our flight back, the staff didn't let us pass for boarding. They said that first should be people who have paid for priority, and we stayed last.
## 462 We had reservations on Ryanair flight FR1393 flying from Oslo to Stansted on September 6 this year. I tried to check in on their website before the two hour time limit but it showed that we did not have reservations for this flight. We went to the airport anyway and were forced to pay the 55 Euro fee each for checking in there. Several people that we talked to while waiting in line had had the same experience that morning with the Ryanair website. I have contacted Ryanair customer service (query number 5917114) and have been told that they will not refund the 55 Euro fees. I will never fly Ryanair again.
## 463 Knock to Liverpool. I will never Ryanair again, even if it is the cheapest flight. I have Never been spoken to as Ryanair ground crew spoke to me yesterday. I was asked by the same girl 3 times in a space of 4 mins for my boarding pass at one point she wrote down my seat number. I use the word asked but in fact \342\200\234boarding pass\342\200\235, no please or thank you in a very demanding way. The last time I told her very nicely that she had already seen it twice, she answered I am aware of that. To which I quietly said to my friend \342\200\234she needs a personality check\342\200\235. It became apparent she heard part of that comment as she came right into my face and said loudly do you have a problem with me, to which I said I beg your pardon, she repeated herself again in my face, and said she would tell the captain to watch me. How very embarrassing. She was very young and wore her ego on her sleeve. Maybe she was not trained that when you are in the business of dealing with the public you really do need manners. Maybe that service is yet another extra cost.
## 464 Berlin to Gran Canaria. I stood in line at Berlin schonefeld airport just over 2 hours before the departure and was told to wait. Other passengers for other earlier flights were arriving and nobody from the Ryanair staff called them to check in. They just let the queue build and build and called passengers for the last check in call. When it was time to check in my suitcase was 2kgs too heavy and I was told to remove items or pay a fine. I had booked priority which allows a 20kg suitcase, a 10kg carry on bag and another small bag. I only had a small rucksack as my carry on so in total I was well below the allocated weight. However this did not matter to Ryanair: A \342\202\25422 fine or take things out of the suitcase. I am still waiting to board this flight and Ryanair has managed to frustrate me once again. Terrible airline and if you can choose any other airline for your chosen destination, I strongly recommend you do so!
## 465 Return flight from Trieste to Stansted. I flew out with a soft hand luggage bag that I have used on countless Ryanair flights, including my outbound trip to Trieste where I was visiting for 3 days. Upon my return, I was made to pay \342\202\25425 as my bag 'did not meet Ryanair's restrictions'- despite fitting comfortably within the measuring 'cage' that Ryanair staff use to assess whether luggage can or can't fit in the overhead compartments. Despite my bag fitting in the cage (and therefore meeting Ryanair's restrictions), my was deemed too long. Bear in mine this was not a hard-shell style bag but rather a soft leather bag i.e. malleable. The most frustrating part of this was that I had flown out with the same bag, hadn't purchased any additional items, and have used this bag on every flight I have ever taken with Ryanair. In spite of my explanation, the staff had clearly made up her mind and decided I should pay rather than use any sense of initiative. In short, well done Ryanair. Rather than buy a new bag, I will now prioritise competitors like EasyJet and Wow who I have never had such issues in the past.
## 466 Malaga to Dublin. I forgot to check-in for my return flight before I left on my trip as one is required to do. When I got to the airport to come home, I tried to check-in on-line using my phone, but the Ryanair app wouldn't let me do it. It said that an hour and a half before take-off wasn't enough time for on-line check-in. So I had to go to the 'Customer Service' desk and pay \342\202\25455 for Ryanair to print out my boarding pass. I think this is an excessive amount of money for printing one piece of paper. in addition, the seats are quite uncomfortable. The gate was at the far end of the airport. By the time I got there, there was no time to get something to eat, so I had to buy food during the flight. I got beef lasagne for \342\202\2546. The price was reasonable, but the food was almost inedible. I only fly Ryan Air when I absolutely have to.
## 467 Birmingham to Chania. Even though the legroom on this flight wasn't bad, I think on 4 hour flight the seat could have been a bit more comfortable. But other than that the flight arrived on time and it was good.
## 468 Chania to Stansted. I was refused to fly today due to my pregnancy. I am 30 weeks + 3 and flew out at 29 weeks + 6 on 25/10/2019 but today I was held at the gate to confirm I was allowed to fly, I was granted board and then once I boarded I was called to the captain where I was told I would have to leave the plane as I was unable to fly but they would fly me back on the next flight available that day free of charge. Once escorted back to the airport we were informed that we would have to arrange our own travel and the next available flight to London is not until Sunday 3rd November. We\342\200\231re now stranded in Chania with little to no help. I should not have been allowed to fly out if they were going to refuse me re-entry to my country of residence.
## 469 Budapest to Stansted, my flight was suppose to leave at 6:30 am, it's been delayed 6 hours. I have not received any explanation, information, they dont even have an information desk. I will never fly with Ryanair again and would advise everyone not to fly with them ever. Very annoyed.
## 470 Eindhoven to Dublin. Very poor refund policy and long waiting times for response regarding claims and refunds. False advertisement on insurance policy's. They claim to give refunds on tickets bought with an insurance package but they wont actually refund your ticket unless you can prove 10 different reasons why you couldn't take the flight. Requesting several irrelevant and highly personal and sensitive documents before considering to give refund on ticket. Ive had a number of bad experiences when it comes to refunds with this airline. The point of paying for insurance is to cover all unexpected occurrences that could inhabit one from using the reservation. Ryanair have made it exceptionally difficult to make contact regarding refunds and have taken 2 to 3 weeks to respond to my claim request.
## 471 Flew to Manchester from Dublin recently. One-way (with one checked in bag) cost \342\202\254180, so not cheap. Then, I was charged another \342\202\25455 at the airport because I hadn\342\200\231t checked in online. I usually fly with Aer Lingus so didn\342\200\231t know there was this charge (nor would I have guessed it was legal to charge \342\202\25455 to print a piece of paper that other airlines give for free). If I didn\342\200\231t pay up, I wouldn\342\200\231t have been allowed to fly. Total extortion. The check-in person said I must have got emails warning me of this charge but they would have gone to the person in my organisation who booked the ticket for me. In fairness, some Ryanair staff I spoke to were embarrassed by the policy. I complained after I paid my \342\202\25455, but I got a pre-prepared statement in response. Oddly, I had an option to fly Aer Lingus this time but chose Ryanair. I won\342\200\231t make the same mistake again.
## 472 Edinburgh to Alicante. I have been flying with Ryanair for many years and make up to 6 return journeys a year from Spain to UK. I hear people complain about the airline but I have never had any problems. Fares are cheap and punctuality is good. Seating may not be luxurious and on board refreshments quite expensive but both are on par with other low cost airlines. Staff are welcoming and do what they can to comply with any special requests. Recently for the first time I experienced a delay departing from Alicante due to mechanical problems with in bound plane. I went on to the Ryanair website and filled in a short form, received an apology within hours and a promise of compensation within 21 days. Several days later I received the money into my bank account. I regularly purchase airline tickets for my children to bring them from various UK airports to Alicante and over the years have had problems with long delay from other airlines - including: when one was 7 months pregnant and had to endure a 2 and a half hours delay sitting in the plane on the tarmac in Alicante. Eventually all passenger were given one free bottle of water! The airline is no longer in business!!
## 473 Palma to Prestwick. 6 mins late for check in and told its Ryanair policy to leave family with special assistance child at airport until I paid. Misdirection at airport standing in wrong queue and my sons autistic meltdown made me 6 mins late, had to borrow \342\202\254275 then I got no special assistant which I booked. My flight is delayed 5 hours and I got told I couldn't get the 4 euro snack. 6 mins late \302\243240, they are 5 hours late and nothing. Their live chat disconnects you when you ask them about checking in. I will never use this company again.
## 474 Barcelona to Manchester. The staff at the gate overcharged my husband to check his saxophone and gave us such a hard time even though everyone else at the gate was trying to be helpful. My husband is always allowed to carry the sax on the plane. He would not give his name so we could not complain to the Ryanair management. He would not get a manager to help us. When we got on the plane, the guy who takes the checked bags said we could board with the sax. No one gave us a problem.
## 475 Fes to Paris. You pay for everything and charged you double if you don\342\200\231t do it online. Got charged for my bag and boarding pass cause they don\342\200\231t have online tickets. Paid for priority and x cabin bags why am I getting charged for a cabin bag like that doesn\342\200\231t make sense. The flight was supposed to be 57 dollars and I ended paying 120 dollars.
## 476 Amsterdam to Dublin. This was the worst experience I\342\200\231ve ever had with any business in my life. My flight more than doubled in hidden fees. You can\342\200\231t go through to check baggage until 2 hours within flight and if you\342\200\231re not at gate an hour before take off they might not let you on. Customer service are robots. So unhelpful and a lot of automated responses. They also won\342\200\231t send you email confirmations to check in, and your login only sometimes works. And then if you don\342\200\231t check in online you get charged. If you don\342\200\231t print boarding pass at home then you get charged, not allowed to use online boarding pass.
## 477 Beauvais to Bratislava. I had two trouble free flights within last two weeks. The fares were very cheap. I purchased priority boarding, so had 2 cabin bags allowance. Website experience was good, the mobile application worked fine, and apple pay functionality was a big convenience. The only strange thing about website vs application experience is that when purchasing priority boarding you can not buy 10 kg checked bag allowance on the website. On mobile you can do this. Another thing to watch is cost of this service. It changes, and the price can double, so if you need it, it is better to buy it early. At the airport check-in desk was not overcrowded. Boarding was fast and efficient, with usual nasty waiting when priority line had to be formed on the stairs and then lined up near the plane. But flying low cost you have to accept this. Onboard everything was ok. Seats are passably comfortable. I purchased hot meal and it was tasty. Toilet condition was good. Departures and arrivals both times on schedule. I was able to read all the bad reviews, but as I can see most of them are written by the people who didn't follow rules and been fined for that. For me the main difference between legacy carriers and low cost is that legacy bring you to your destination whatever happens (they put you on different flight or on competition company or re-route you). Low cost carriers just say sorry and do refund. This is where the real difference is. All the rest become more and more identical.
## 478 Ibiza to Milano Bergamo. Before getting to the airport I have received the notification that online check-in was required otherwise a fee of 55 Euro per person would have applied. I tried to do the check in at the airport (2,5h before flight departure) and the app was malfunctioning. I requested some help from the info desk and they could not solve the problem or even help in any way. After a while they realised that I needed to board and gave me no options other than paying 110 euro (2 people) at the counter. They suggested me to contact the customer care straight away and explain the issue. I did so right after and sent an email through their website. They answered me after 10 days telling me that I should have done the check in online.I then contacted the customer care via the live chat and they were absolutely useless. They told me to call the call center and provided me with a number that work only if you are calling from Europe. Once I explained that I live in Australia they said they are sorry and that there was nothing they could do.
## 479 Prague to Bologna with Ryanair. Paid for carry-on, forced to use check-in, carry on not refunded. Customer Service are robots. No humanity. I am tired of feeling like the object of their constant sales pitches.
## 480 Flew out without problem. Checked with staff at Liverpool if bag size was ok, they confirmed it was. On was back from Lanzarote was informed bag was too big. Staff were extremely rude, demanded money to store bags. If we didn't pay extra we would not be permitted onto aircraft. Explained had paid for extra leg room so plenty of storage under seat, nope still had to pay. Bags were taken off us, so no phone,no tablet, no money for drinks etc. Horrible end to a great holiday thanks to Ryanair.
## 481 London to Barcelona with Ryanair. The priority queue is much longer than the normal queue. What a joke! Also they ask you to get to the gate for boarding and then keep you waiting at the gate for over half an hour. These things happened on both legs of the journey. A really useless airline, to be avoided.
## 482 Seville to Valencia with Ryanair. I am extremely disappointed with this airline to the point where I will not be flying with them in the future. I find this airline to be very cheap and non understanding. As a student studying abroad, I am on a very tight budget. I have very little data while abroad and so I did not know it was required that I check in before hand. I was charged 60 Euro, when the email said \342\200\234you might be charged a fee\342\200\235, not might, there was no discussion, no alternative ways presented, and I was forced to pay 60 euro for a piece of paper all because I didn\342\200\231t read the fine print terms and conditions. I find that response from the staff extremely sneaky, rude, unempathetic, and honestly quite dumb as I have never once flown on another airline where you can\342\200\231t check in happily and for free at the airport. I asked them why I was paying 60 dollars and the response was \342\200\234because you didn\342\200\231t check in online\342\200\235. Extremely unimpressed with the staff, quality of flight, and airline logistics in general. I recommend paying that 60 more dollars to find a better airline.
## 483 Berlin to Edinburgh. Avoid this airline like the plague. They post cheap prices yet continue to add additional costs as you click through the online ticketing system till the ticket is the same price as any other respectable airline. When we tried to check in online, their website continued to notify us of an error to the point where we waited to check in at the service desk. Upon arrival, we were told there is only online check in and would have to pay an additional 55 euros each. This airline is a disgrace.
## 484 Manchester to Majorca. This company makes money from splitting up young families, their system automatically splits young children between the ages of 12 upwards forcing families to pay extra to sit next to their young kids.
## 485 Ibiza to Glasgow. Disgraceful airline with employees who have 0 customer service skills. Charged 55 euros for myself and my wife because we were unable to do an online check in because the email address was wrong. To add insult they sat me and my wife at opposite ends of the plane. We were also charged 25 euros for hand luggage which ended up in the hold. I'll never use this horrible airline again.
## 486 Nuremberg to Bergamo. A big disappointment. This was my first time using this airline. I am sure, it will be the last time, too. I had heard a lot about Ryanair, good impressions, I mean. Unfortunately, nothing was true. First of all, it was very expensive, and then, not correct. I was charged for luggage less than 10 kg, a small one because I didn't book under the Priority category. 25 euros for nothing. Maybe the company is in crisis. I am happy then to know that I helped the company to survive.
## 487 I am writing my second review for Ryanair and it is only my second time flying with them on a return flight. It is my first and last time flying with them! I strongly, strongly advise you to never ever fly with them on principle alone! Their baggage rules and deadlines are ridiculous. As a whole I paid an extra $162 Euros for a flight that was only supposed to be $94 Euros. In Canadian, that is almost $300 extra dollars so naturally I'm upset. The worst thing about this company is the complete lack of customer service. The carry-on I took to Madrid is built in the dimensions to fit all cabin flights. The exact same carry-on I took from Madrid to Porto was all of a sudden too big to return to Madrid. I tried to explain this to the staff member and the first thing she says to me is, "I'm just doing my job, it's not my fault they weren't doing their job over there." Note that this is the exact same company and the inconsistency is frustrating. She asked me to come with her and check the size and in my opinion it fit and she disagreed. I asked to talk to the supervisor who approached me with hostility and attitude. She called me "baby" and when I kindly asked her not to call me that she called me it three more times before I refused to speak to her. I went to another Ryanair desk and asked another staff member who must have been instructed by her supervisor to treat me poorly because I simply asked her, "Where is your customer service desk please?" All of her body language including rolling her eyes was rude and I asked her why she was giving me attitude when I asked a reasonable question. All she told me was "third floor" and when I asked for more specific details she was reluctant and rude the whole time. I followed her instructions just to be told by security that the Ryanair customer service was outside which this staff member did not mention. Not wanting to miss my flight, I opted to pay whatever fee they needed and was met with minimum information, being rushed and two people talking to me at once. Once said I had to pay 25 Euros and the other said I had to pay 50 Euros which I ended up paying with no print out receipt which I had received on the Madrid side. This company can not assume that everyone knows exactly how everything works and they need to learn to treat people reasonably if they are incapable of kindness. On my first experience with Ryanair I interacted with a total of 8 very poor employees the worst of which was the supervisor from Porto who called me "baby" after kindly being asked several times not to do that. This company needs to go out of business. They are not worth it. Please do not choose them! People over profit.
## 488 Prague to Barcelona. I wanted to check in, and realised that they changed the cabin luggage standards, so now we had to buy extra just to have a standard cabin bag. Also they want us to pay money to sit together, what a rip off, I'm so mad! I will never book Ryanair again and I will let everybody I know, know what criminals they are.
## 489 Barcelona to Rome with Ryanair. Horrible experience, the boarding process was terrible, two lines next to the bathrooms and to a stair. In the plane it was a mess to get to your place. The seat is everything but comfortable even for a short flight, in our case less than 2 hours. The cabin crew were so rude. Finally our landing was terrible. I don\342\200\231t recommend this airline.
## 490 Manchester to Belfast. Horrid staff and customer service. Make you pay extra for everything incl carry on bags, seats and check-in. Ended up paying the exact amount as of the return ticket fare for just checking in prior to the flight. Plus the security check guys messed up capturing my baby's image which made us miss the boarding call by 2 minutes. The staff did not allow us to board the flight because the gate was closing and we were asked to wait and later said they wouldn't allow us to board.
## 491 In Pescara, we paid twice to check in our luggage. Shameful I'll never fly again with Ryanair. If i do, I will take my precautions. Be careful with them.
## 492 Manchester to Marrakesh. Never again will I fly with Ryanair. What a rip off! You pay for absolutely everything I checked in and was hoping to be seated with my family. My husband had to sit with our 2-year-old. I sat with my daughter who has fear of flying and even then I had to beg someone to swap seats with my son. Sat at the back of the plane, the cabin crew were awful and useless no customer service whatsoever. I asked for my baby\342\200\231s milk to be warmed and was snapped at saying they don\342\200\231t have this facility yet the other member of staff heated it for me. On our return they were out of milk so when I paid \302\2433 for my coffee they had no milk because it was their last trip as if that\342\200\231s my fault. Crew members are rude and arrogant. When we asked to be seated together we were asked to pay extra and even then our seats were not guaranteed. We had to pay extra for baggage considering we had kids travelling with us there was just no consideration very strict with luggage going into the hold and what can go in the overhead. This airline is not very lenient and doesn\342\200\231t work out very cheap at the end.
## 493 Stansted to Thessaloniki. The worst ever. I will never ever waste my money and board this flight again. Stuff so rude, no manners at all. The Manager on the 8th, 4.55pm flight to Thessaloniki was way out of order, 7 of us missed the flight and she made it a point that we were not going anywhere. They never announced our names.
## 494 Madrid to Porto. Worst airport experience I've ever had. I will preface this by saying I checked in almost 24hrs before my flight and that I have only ever missed a flight once before and United airlines got me on another flight no problem, no fee. I understand that it's your responsibility to not "miss your flight" but when I arrived one rep tried to respond to my distress and I believed was berated by another worker in Spanish and then worker became rude to me, one word answers, pointing to arbitrary directions. The next person I spoke to was also rude, I asked about my options and was only given 100Euro exchange of flight option. I asked to speak to a supervisor who essentially threw a pre-written customer service paper at me. I explained that I would just like help and would prefer to do it at the airport. He walked away and I had to follow him and ask again for a number. He again was short and pointed in a direction just saying "there". At this point I was very upset because customer service usually responds with sympathy and kindness even if nothing can be done. I waited in line and the initial female I spoke to was avoiding me. I had to insist on receiving a number from the other male rep who reluctantly gave me an incorrect number and did nothing further to help me after I showed him it didn't work. I had to search up a correct number online and at least the rep on the phone was more reasonable, but I will never ever fly Ryanair again. The cheaper fees are made up in baggage fees. You are locked in once you make a purchase which was terrible because I would have rather paid 200 Euros extra to completely change to an airline that actually cares about their customers. Furthermore, I missed this flight due to confusion on Ryanair airs website and the language barrier. They should provide better instructions to the ridiculous setup at the airport, make it easier to find or provide a general direct address if possible! Lastly, they should actually try to help people and explain things in a reasonable way, preferably with more than one word answers. They're response was not due to language, they were rude from the boarding desk, to the help desk, and the supervisor was the worst of it.
## 495 London Stansted to Barcelona with Ryanair. They make you pay even for the air you breathe, their luggage policy is unbelievable. If you think you pay less with this airline be aware that at the end of the day you will pay more, trust me.
## 496 Barcelona to Kiev. The worst airline ever. Be extremely careful with everything they could potentially take additional charges for. Number one - online check-in. They lure people to miss online check-in by any means and they charge an insane price for airport check-in. Other than that the service and planes are very poor. On my 4hours flight, they didn't even serve water. Seats are extremely uncomfortable.
## 497 The online booking system by Ryanair was causing random issues for me and they deny their faults. On booking this trip for November 2019, I've used the pre-defined flyers information saved in my settings and everything seemed alright upon payment. The confirmation email however was showing my family name as name of the main passenger (despite using the pre-defined passenger information as said), making it impossible to "correct spelling mistakes for free". I did call the customer service, and for two times the line was cut mysteriously making me spend additional 13 euros for a phone call, just to be told it's my fault that I didn't check that everything was alright before paying. I've had to buy a new ticket because it was cheaper than paying the fee for changing the passenger name. Of course they didn't want to refund the unused ticket either. Again, I was booking a flight for another person and added a checked-in baggage for an extra price of 50 Euros (25 per flight). I did check again that everything was alright when paying, and the confirmation email showed that I was only charged 49 euros (instead of 120) and the baggage was not added. Of course adding it at a later stage means paying 80 euros instead of 50.
## 498 Dublin to Glasgow, the flight took 40 min but waiting time in the plane before the take off was 1 hour and half with no opportunity to get water (crew explained they could use a bar only during the flight) or use the toilet. Not all of crew members were nice and polite. On the way back we didn't success in time to do online check-in (our fault, I agree) but we've been just 7 min late to do it. Where is the loyalty? We payed 60 euro for each person just to get a boarding pass. That's crazy! Does in any other company a boarding pass can cost more then a ticket? We are very disappointed with this company, their rules and will not use their service ever again. Better to pay more or fly with a stop than be treated like that.
## 499 Dublin to Gatwick. Barely a minute when I left flight FR116 of 2nd October, 2019, seat no 32F, which was the second to the last seat to the rear cabin area of the plane ( and I was the only one sitting on the row) when I discovered that I have either left my wallet on the seat or it has dropped off on the floor. Earlier in the flight I hesitated changing one of my \342\202\25450 note to buy \302\2433 water and I told the female cabin crew member same. She asked me what coin I may have and I had \342\202\2541.20 and she said she was sorry that it's not enough. So I think I mistakenly didn't put my wallet back in my pocket as I intended to. When I made to go back to the parked plane I was told by a security man that I cannot do that and he asked me to make a call on a phone he pointed down at the hall to let them know that I had left my wallet. I made the call and was told that I have to make the complain at the counter. I got to the Ryanair counter in less than 2 minutes and informed the Lady there of my missing wallet. She called someone and hung up and told me the person will call back in 10 minutes. 10 minutes went to 15 minutes and she called back again and was told that the cabin crew members had not found anything. The back n forth went for nearly 40 minutes with me calling customer service who gave me a phone number that hasn't gone through till today. As directed, I went to get the Lost property Contact since I was told that it takes 24 hours for a lost item to be reclaimed. My flight arrived Gatwick a few minutes past 5 but I ended up leaving the airport by 7:30pm because I didn't have money to pay for a taxi home and couldn't reach family that could help. My Credit and Debit Card, plus \342\202\254101.20, \302\2431 and Oyster card was in that wallet. Finally, a friend helped booked me a Taxi. I can't believe that my wallet disappeared into thin air. I was one of the last 3 to leave the air plane as I had 2 elderly people sitting behind me. I don't think the eagle eyed crew members on the flight could have missed seeing my wallet.
## 500 I wish I could put zero stars. My family and I were flying from Menorca to Madrid over the summer. We got to the airport two hours before the flight. There was only one person at the counter doing the check in for the whole plane. We waited 1 hour and 20\342\200\231 to be exact until we got to the counter. The person at the counter tells us we don\342\200\231t have the boarding passes printed. We had our reservation print out but not our boarding passes, I had tried to do the check in the day before with no luck. Since I was traveling with scattered internet and no printer available, we assumed we would be able to check in at the airport but no. We were sent to another counter at the airport with a Ryanair supervisor who started to mistreat myself and my family. She said we had to paid \342\202\254220 as a penalty for not having our boarding passes. Of course we were not happy about this but we handed out our credit card and asked her name or employee identification number so we can later make a complaint about her mistreat to the company. She did not like that. She refused to give that information as well as taking our Credit card saying "Why should I give you my name, I don't have to". After these unfortunate exchange with her. I grabbed my phone to see if I could find any way to get the boarding passes online. She accused me of taking a picture of her, which did not occur. I offered her to check my phone and confirm that I wasn\342\200\231t filming or taking pictures (the airport police confirmed what I was saying was the truth later) and she refused to do that as well. Her assumption was wrong and decided to punish us denying to let us board on this plane or any future Ryanair flight. We asked for help, to see if we could talk to anyone else (any reasonable person), she refused to help or to refer us to any other place that we can address our concern, she wouldn\342\200\231t talk to us. We asked for any airport authority or for the police to help us out to no avail or response from anyone. In our desperation for help since we were missing our flight my husband had to yell in the middle of the airport calling the police for help to be able to get some attention but no one came. Finally we went to a different company counter and asked them to please call the police for us, the finally called them. Not only we were humiliated by this person who showed abused of her authority but we had to buy new tickets for \342\202\2541000 and got stuck at the airport for 9 hours for a total arbitrary decision of someone who couldn\342\200\231t prove any bad behavior on our end. The airport police finally came, we talked to them for a while, we were quite altered by the situation by then they said they could not give us any information of this person and had no authority on the flight since it was owned by a private company so they could not help us. After complaining to Ryanair, they did nothing, they don't care about their customers, they just want your money.
## 501 Venice to London Stansted. My third flight in a week. Other two great, Prague to Brussels with Brussels Airlines and Brussels to Munich, with Lufthansa. No problem, no delays, seamless transition. Ryanair a completely different story. The flight was scheduled to leave at 9.55, it\342\200\231s now 11.05, only just got on the plane, still at least one other busload of passengers to get on before take-off. No explanation or apology from Ryanair. Not great service!
## 502 Gatwick to Shannon. Ryanair staff were very unhelpful and put my 12 year old daughter on a flight on her own while they held me up until I missed the flight because of an error they made. Useless company please do not use when you can use other airlines. Even the security couldn't believe how bad they were.
## 503 Although the gentlemen cabin crew were very pleasant and helpful during the flight in comparison to the flight on the way to Gran Canaria with the cabin lady been so rude and ignorant and too busy flirting with the other cabin crew. On the flight back to Birmingham on 30/09/19 I wanted to purchase the Versace Yellow Diamond Intense perfume from the book given out which was \342\202\25435.20, when I smelt the tester and asked to buy it I was then told I couldn\342\200\231t purchase it at that price and it would be around \342\202\25446/\342\202\25447 due to Ryanair updating their app as the catalogue books was being changed the following day, surely it is false advertisement and what is the point in offering the books out if you are not going to honor the price it is advertised at? I felt it was misleading.
## 504 Ryanair not recommended when flying with young children. As an Australian tourist in Europe, I was unaware of the existence if so called 'online airline companies' and thus unexpectedly hit by 3 times a \342\202\25455 airport check in fee (for a \342\202\25440 flight) But despite that, Ryanair was unable to provide seating for my wife, our 5 month old baby and me together. Airport check in staff said that seat selection is done 'randomly' at Ryanair and referred me to cabin crew who were unable to help out either. Therefore, my wife and infant son were seating at the front of the aircraft and I was seating almost at the very back despite the one booking made. Contacted Ryanair to express my unhappiness about the unjustified charge of \342\202\254165 for check in, and still not being able to sit together. However received only a very rude email back referring to terms and conditions and their random seat selection policy. First and last time with this lousy company.
## 505 I and my daughter had a plan flying from Brussels to Berlin - FR163, 30 Aug 19. Departure time - 08:15. When checking and dropping at counter, Ryanair officer check our documents (boarding pass, passport and my daughter\342\200\231ID) and everything is ok. But when boarding, 2 officers saw my daughter\342\200\231s ID and said that she could not fly because she need her passport, her ID was not accceptable? So, we could not fly. We had to change all our plan. Why my daughter cannot use ID? Why don\342\200\231t inform customers when we buy ticket, checkin in counter. Unprofessional work! We only know when boarding, a few minute before flying. So that, the suitcase had to turn back from airplane to airport and we spend about 1 hour to get my suitcase We need a correct answer and pay for expenses incurred as a result of the cancellation: new ticket, hotel cancellation because my daughter\342\200\231s changing plan and other.
## 506 Salzburg to Stansted with Ryanair. Paid for priority boarding, get processed and boarded at the same time as the non priority passengers and put on the plane thru one entrance. This is an absolute rip off, save the money and book the basic flight with extra luggage, it is cheaper and you get the same treatment. Or even better book your flight with someone else like Lufthansa etc.
## 507 Dublin to Split. Very frustrating check in process at Dublin Airport - online access through phone internet was extremely clunky: first to log in and secondly to enter traveller details. Spent a very tiresome 1 hour getting this done. Then since no access to a printer we were directed to a luggage drop off desk and someone who printed our boarding passes and tagging and accepting our bags.
## 508 Cardiff to Malaga. Lovely welcome. Great service, friendly staff. Thank you for my safe flight thumbs up from Wales. The flight was perfect even the captain had banter with me. I'm a nervous passenger
## 509 Berlin to Madrid. Before explaining the bad experience that we had with this airline, I will mention that we missed over 1000 euros at the airport just because this airline forced us to do so. Well, the low price of this flight naturally attracts you when you are booking your ticket, but if you know for different unreasonable reasons that you might have never heard before in your life they will charge you over 1000 euros and does not let you get into your flight, you might change your mind. With my family, we were traveling from Berlin to Madrid, and since we had check-in luggage, I decided to not do online check-in. We were among the first people that went to the check-in desk and there, they told us that we should have done online check-in 3 minutes ago at the latest and now we have to pay 55 euros per person for them to do the check-in. So we paid this money, and again we were among the first people who were at the gate to go to the airplane. When they were checking our boarding pass, they said that there was a problem with one of our check-in luggage and we can not get into the plane! (Later they never informed us what was the problem.) When I tried to convince them that they have to wait for us to solve the problem, their crew rudely shouted at me! They told us to go to the Ryanair desk at the airport (SXF) and there they told us that this is not their responsibility and there is no one there to help us, and all we can do is writing a complaint letter! The only option they gave us, and they believed that we have to be thankful about that, was paying 100 euros per person and get new tickets for the day after, and since I was with my family and had no other reasonable choices, I had to pay more money and book the ticket. After all, they destroyed our vacation, and we had a lot more additional costs for the hotel and all other expenses to spend the night in Berlin. I received the answer to my complaint letter yesterday, and they do not take any responsibility and do not pay any money back.
## 510 Brussels to Milan. It is unfortunate that Ryanair dont read the complaints fully. It states we checked in online a day in advance! We have not received our boarding passes. So we arrived at the airport 2.5 hours early! To get our boarding passes at the airport employees send us in 3 different lines and said they could not give us a boarding pass cause the system said we already checked in and should have received our boarding passes. This took 2.5 hours with all the waiting lines and then they send us to flywise\302\240to contact them for our boarding pass. Very rude employees at the airport.
## 511 Rome to Seville. \342\200\234Beaten on the spot\342\200\235 I\342\200\231m not a regular flyer of Ryanair and thus have never noticed their change of policy about the checking in and the hand luggage. With a mentality that it\342\200\231s similar to other airlines, I thought I could do the check-in on the spot. When I arrived at the desk, the staff told me that I had to do the check-in online and cannot do it any more now. Then I was told that I have to go to the ticketing office upstairs to pay 55 euro for the check-in and come back to him. He also told me, \342\200\234You can jump the queue and come to me once you have paid.\342\200\235 Then I showed him my 6,9 kg hand luggage suitcase, then he told me, \342\200\234You cannot bring this on board and you have to do check-in luggage. For this, you need to pay 25 euro.\342\200\235 Hearing this, I was very shocked. I told the staff, \342\200\234This is furbo (cheating), if a person travels for the first time with this airline and does not know the regulations, he/she has to pay extra or even more than the actual ticket.\342\200\235 Having no choice, I went to the ticketing office. While waiting for the staff to do my check-in, a gentleman arrived breathlessly as he was running to the desk to see if the staff can help him as the departure time of his plane had changed but he did not get any notification. The staff coldly said, \342\200\234No, the gate has already closed.\342\200\235 The gentleman asked, \342\200\234Could you do anything?\342\200\235 The staff replied, \342\200\234I\342\200\231m sorry, I can do nothing.\342\200\235 After paying my 80 euro, I went downstairs to the same desk and to the same staff who asked me to go to pay. Then he printed out my ticket. My questions are that, \342\200\234Isn\342\200\231t he working at the same desk, doing the same procedures of checking in? Why can\342\200\231t he print the ticket before I made the payment and can print it after I paid?\342\200\235 A thought crossed my mind that \342\200\234This airline lives on fine and on taking advantage of those who have no or less knowledge?\342\200\235 There\342\200\231s blame on my part for not knowing that I have to do online check-in earlier but there\342\200\231s also the cunning/cheating part of Ryanair.
## 512 Terrible experience on the flight from Rome to Lisbon (FR2692 @ 14:20 on the 16/9/2019). We went to weigh our bags before the flight just to make sure and were surprised to find all our bags registered as \342\200\230over weight, please pay \342\202\25440\342\200\231 even my wife\342\200\231s tiny handbag was registered as \342\200\230over weight\342\200\231. It was obviously set to charge customers regardless and shows how underneath and conniving Ryanair really is. The staff at our gate entrance was very very rude and made us pay for our cabin bags at the time we felt most vulnerable to get onto the flight. \342\200\230You either pay now, or you miss your flight\342\200\231. Apparently \342\200\230the rules had changed\342\200\231 despite flying with the same luggage with the same airline to get to Rome (also not an issue with the same cabin bags on multiple flights). She also refused to give us her name and said they would send us a receipt of the extra \342\202\25450 we had to pay for our baggage. We are still yet to receive this. Not to mention they didn\342\200\231t notify us of these baggage dimension changes until the day before when it was obviously too late for us to change, as this was a connecting flight, and despite the fact we had already paid for a flight with cabin bags included. On the flight, my wife and I were needlessly split up as were a lot of passengers which left us all grumpy but no where near as grumpy as the horrible staff. Where my wife was sat there was dried blood around the seat. She also needed to use the bathroom, which was filthy and covered in urine. When she enquired as to a better option, the attendant locked the door of the dirty toilet and simply opened a previously locked bathroom. What was the point of having that option locked to customers for Ryanair\342\200\231s convenience rather than the customers? Delays with our bags at the other end too. Lesson learned, avoid Ryanair at all costs. They advertise as cheap but after adding the other costs they try to rip you off with it ends up more than an actual decent flight. Cost 5/10 Service 0/10
## 513 Flew Bologna to Bucharest with Ryanair. The plane was late and we had to wait over 30 minutes in the terminal. Moreover, I flew with my father and uncle and we got one seat in the front of the plane, one in the middle and the other in the back.
## 514 Prague to Stansted. They are what they are. Typical low cost carrier with no frills. If they fly you to a different country for the price of a taxi, then unless they are late or cancelled I can\342\200\231t complain. I\342\200\231m happy to fly them if they save me lots of money.
## 515 Second time MAN-RIX this month on business. Excellent flight, which departed slightly late, but due to weather rather than anything else. Arrived in Riga five minutes late, which is hardly a criticism. Comfortable and pleasant flight, and as ever with Ryanair, a straightforward and simple service.
## 516 Worst airline ever. Checking in was extremely difficult, it wouldn\342\200\231t let us do it online because it gave the child ticket to someone else in the group. So we came the suggested two hours early only to wait in line and get to the desk a few minutes past the two hour mark. They made us pay \302\24355 each because we weren\342\200\231t there two hours early and it wouldn\342\200\231t let us check in online. We had a rather large group of six, four paid for carry-on and two for checked bags. Only two people got the bag they paid for. The flight isn\342\200\231t much better, overpriced food and uncomfortable seats. Do yourself a favor and do not fly with Ryanair, it\342\200\231s not worth the stress, the hassle, and the over all pain in the neck.
## 517 Southend to Alicante with Ryanair. Great flight. Good customer service. I was feeling ill during the flight due to kidney problems. One air hostesses asked me if I was feeling better as I left the aircraft. Shame I don\342\200\231t know her name, this was the first flight from Southend to Alicante on Sep 24th 2019. She allowed me to use the toilet that was out of order due to a water leak as I was going to be sick and didn\342\200\231t have to get to the back of the plane.
## 518 Frankfurt to Valencia. I cannot find any positive aspect of traveling with Ryanair. 1. Booking System of Ryanair: it is as shitty as you expect it to be from a low cost airline. The prices seem to appear low at first sight but in the end you end up with ruffly the same amount as with other airlines. They try to sell you so much shit you don't need. Like it was worth being in boarding group 1, going through a "fast lane Check in"... In the end you just wait as long as everyone else because it doesn't make the whole boarding faster, but Ryanair sends you Emails saying "better buy it, don't lose time at the airport, board hands free,..." putting you under pressure to buy all the extras. Why would you need to book extra "sitting together"? Despite the fact that you are able to spend 2 hours in a plane without sitting together and if needed kindly ask one of the other passengers to change seats. Ryanair's seat booking system could easily make you sit next to each other but it doesn't do it on purpose so you spend again extra 7\342\202\254 or more just to sit to your beloved. All buttons on Ryanair's website which say something like "add to card" are highlighted but the ones which say "skip" are not just to make you feel you need to buy stuff. 2. The actual flight: In the airplane the whole tables are screwed to the seat so customers can't eat from them and the seats got no bags for your laptop etc. so Ryanair "saves time" during the cleanup for the next flight. Of course they always have some "special offers" in the air and they disturb you several times wanting you to buy parfum\303\251 or other stuff that you "need right now". 3. And what's about the luggage thing?! It always was a wired thing in every airline but Ryanair took it to another level. As it would matter if 2 kg too much on the luggage are taken out and put in your hand luggage, it's still on the same airplane?! Ryanair changed the policy of luggage in November 2018. So a normal hand luggage (55x40x20) that counts for every other airline is considered to be normal luggage for Ryanair now. And of course everyone who takes his old loved hand luggage now to the boarding gate is stopped by Ryanair and charged 25\342\202\254 extra. So by bearing everything written in here in mind I cannot book any flights with Ryanair anymore and I don't recommend it to everyone else who are thinking about it. Globalization okay yes - but Ryanair is one of the bad examples of it.
## 519 Don't be fooled by their low cost flights. With the delays they have, you'll end up spending more in an airport. We had a flight from Bari to Rome with a delay of 93 mins yesterday and due to bad weather conditions the plane landed in Bologna instead. After that, we didn't know what to do. Nobody was there to take control and tell us what will happen and to guide us to the next steps. They didn't even provide any water or biscuits. After which a bus was provided to take us to Rome for 4 hours bus ride. We were amongst the "lucky ones" as we boarded the 1st flight. They were only able to take 50 people for the 1st batch. For the 2nd batch, they had to wait 2-4 hours for the next bus. All in all, we arrived in Rome with a 9 hour delay from our original flight. We were supposed to arrive at 12am but we arrived at 9am today instead. We have another Ryanair flight today at 17.20 and of course, once again they are delayed. 2 hours of delay so far, I bet it would be much more.
## 520 Ibiza to Barcelona with Ryanair. Really bad experience, really poor customer service! Flight is cheap but there are waiting around the corner with a 56 euros fee when checking in. Be aware and go check out the website or even better, use Vueling Airlines!
## 521 Barcelona to Berlin. I recently took my first flight with Ryanair. When I purchased my flight I added the priority 10kg bag for the extra 13\342\202\254 each way. When I first got to the airport they informed me that my bag was too big. They told me the fee for oversized baggage was 40\342\202\254 but I mentioned that I had purchased the priority bag and asked if that fee could be deducted from the oversized bag fee. They were very rude and blunt and told me "too bad, it is your own fault." In total I ended up paying 106\342\202\254 round trip just for my bags. My second issue was when I got an email the night before my return flight informing me that Ryanair was on strike and to show up to the airport 3 hours before my flight, so we did. However, the flight still took off 1.5 hours later than scheduled. After arriving home, we quickly grabbed our bags and went home. When unpacked my bag later that night noticed the entire bottom of my suitcase was cracked and broken. This is a brand new high-quality suitcase and it can no longer be used. I tried to email Ryanair followed by multiple phone calls and attempting to use their 'chatbot', to no avail. So I followed up every single day for the next five days, emailing, calling and trying the chatbot. They also charge for every call to their customer service center (yes, it\342\200\231s true) so I racked up quite a bill just trying to get ahold of someone. The customer service phone reps all told me different things: one person said I would have to contact the airport and ask them how I would get a reference number since I didn't do it when I arrived, another told me it could only have been done at the time of arrival, and another person just told me to fill out a contact form online with pictures attached. Calling the phone numbers I was given were either disconnected numbers or just a loop of automated voice options which lead you back to the original menu options or tell you where to look online. Dealing with their customer service was a loop of confusion and mixed messages, and my time for filing claims ran out. It\342\200\231s impossible for customers to get a hold of customer service or file claims just so they do not have to deal with the issues that arise.
## 522 Travelled from Dublin to Bergamo with Ryanair today in seat 2D, which was well worth the extra cost for the increased legroom. Flight left on time and arrived early. We had no issues what so ever. Read the terms and conditions carefully and follow the rules and you can't go wrong, its all on the website. Its a low cost airline that gets you from A to B, any expectations beyond this are misguided!
## 523 We booked Ryanair for from Dublin to Edinburgh. Was great price and I did not think much about all of their limitations and surcharges. I did not have way to pre book and got to airport to get boarding pass. \302\243110 to print boarding passes for wife and I on inbound trip. Took less than 5 minutes to check us in. Unbelievable! Could not find anything in email confirmation for flight that indicated there would be a charge for this. I'm sure it's in the fine print somewhere but I could not find it. Whatever, we dealt with it and enjoyed Scotland. On our way back, that's when things took a turn for the worse. We pre-check this time and go to turn in our paid for checked bag. It's a bit over 10kg limit. I'm American and did not even think to check conversion. Why the heck would a checked bag have 22lb limitation? They wanted \302\24388 for the extra weight after I already paid \302\24360 for checked bag. I'm furious, might have cussed a few times and the attendant now tells me we are not allowed on the flight. Yes, we were booted and had to find another method to get back to Dublin. They even called the police. I will never give Ryanair another dollar.
## 524 Definitely my last experience with Ryanair. I had selected MS on the passenger details and was unable to do the check in online due to the fact that the person was 50 years old. I have been told by the customer service team to sort this out at the airport. I had to pay \302\24355 to do the check in at the airport after explaining my case. The customer service team told me in a rude unprofessional way that it was my mistake as I selected MS which means under 16 yo and that\342\200\231s why I wasn\342\200\231t unable to do the check in online to a 50 years old woman. Here is the definition of MS in UK: Ms. vs. Miss (and Mrs.) ... Ms. is a title of respect before a woman's name or position that does not indicate her marital status. Miss is title of respect before a woman's name or position that is used when a woman is unmarried (It is often used in reference to a child, teen, or student). I sent several emails to the customer service team and they all have been ignored. My holiday was ruined by this company. Never ever again
## 525 Frankfurt to Dublin. Dealing with this company has by far been one of the worst experiences I have had when working with an airline. I had a change of flight and had purchased the travel insurance to make sure I was covered. When making the initial purchase, the travel insurance was offered to me after I put in all the information stating I was an American and not an EU resident. When submitting a claim to get some money back, they explicitly denied my claim because of not having an EU residence. Working with their customer service to work on the claim, they have not provided any of the information that I have asked for in order to look through the "insurance" that was provided. Absolutely a terrible company and I will never fly with them again and recommend to everyone to avoid this company.
## 526 Manchester to Riga. An excellent flight. Was sitting in seat 20A and travelling to Latvia on business. Arrived early, and flight was only two hours! As always with Ryanair, I got what I expected, and nothing more or less.
## 527 Ibiza to Leeds. Our flight was at 18:40. We went for breakfast at about 10am and which point I attempted to check in, there was an error, I left and tried twice more later in the day to no luck. At the airport we went to the "check-in" area where we were told by a very rude member of Ryanair staff we couldn't check in there because we hadn't done it online and we would need to go to the other side of the airport and pay 110 euros plus another 50 for not checking the bags in. I explained we were unable to due to problems on the ryanair app, two members of staff told us that they were aware of the problems but we needed to pay - members of staff were very unhelpful, very rude and very unprofessional, one even refusing to look at us at any point and both refusing to get a manager. We had to pay the money as we needed to get back, but I am disgusted with the customer service and the price of printing two boarding passes, how they can justify \302\243110 to print two pieces of paper I will never know. Finally when I got back I emailed in a complaint there response ignored all the points and information I provided and just said no refund. I am fuming, disgusted and a fantastic holiday has been ruined by this disgusting excuse of a business. Not that it will matter to them but they have lost two customers through this experience.
## 528 Edinburgh to Palma return. The airport staff were rude and ignorant. I had paid for 2x20kg bags and was on the understanding that was both ways but I had to pay \302\24340 in Edinburgh for a case to go on flight and \302\24350 from Palma to get the same case back home with me. I also had to pay \302\24319 to change my husbands seat so we were sitting together. I dont understand why a couple checking in together aren't seated together - its always money, money and they do nothing for you as we even have to weigh our own bags print the tickets that go on the cases and put them thru baggage drop and all the time there is plenty staff, and none of them speak to you or offer help. Never again, shocking how they are getting away what they do .
## 529 Rome to Budapest. We are 2 travellers with luggage travelling from Rome to Budapest and encountered some issues with the staff as they wouldn't check us in unless we paid 110\342\202\254, saying that they have sent me an email this morning reminding me to check in online. That is unacceptable to treat customers that way, especially when they have luggage and did not check in online, and say that we should have read the terms and conditions for that clause. Ryanair will take advantage of your situation as they know you have a plane to catch and limited time.
## 530 Dubrovnik to Dublin. This airline is a joke but a little bit cheaper at times and the dates suited us to go. Flight was 3 hours delayed flying over and now delayed 18 minutes on departure flying home. Airline is one of the most unprofessional airlines for time keeping.
## 531 Berlin to Palma de Mallorca. This airline is the worst I have ever flown with. We arrived at Berlin Tegel Airport 1.5 hours before our flight to check in, only to be told that Ryanair only does online check in and sends a reminder email (which I did not receive). We pleaded with them to let us check in online now and they refused and told us to pay 55 euro each or miss our flight. Our original flight was only 30 euro each, so they charged us more than the actual ticket. We told them this is absurd and terrible customer service and the lady at the ticket counter literally said "how do you think Ryanair makes their money? Its not my fault its just the way they operate". To make matters worse, we paid online to be seated together and when printing out our boarding passes for a fee of 110 euros in total, we were told by the check in woman that the computer has automatically generated us different seats and there is nothing she can do. So appalling. Will never fly with them again.
## 532 Hamburg to Dublin. I fly with Ryanair once or twice a week over 40 weeks of the year. Going forward from my experience today only because they are cheap. And they are a horribly cheap airline with an absolutely horrible customer service. I had a problem checking in via their on line app this afternoon. As a result I ran past their check in deadline time. I rang their service team who told me to go to their service desk at Hamburg. Long story short they charged my \342\202\25455 to check in. I now know their charges on late check in but there was absolutely no empathy for my issue. No flexibility and couldn\342\200\231t care less. It was about getting money from me. I had another occasion to contact their customer service team to get back an iPad that I left on their plane. Again absolutely useless in either their knowledge of how to help me and they didn\342\200\231t care. Luckily I was able to get the iPad back due to the find my phone app. I will fly with them only (and only) because they are cheap. So I will use them the way they use their customers. I predict the unions will create a situation where Ryanair will end up having to charge the same as much better and reputable airlines like Aer Lingus (an absolute pleasure to fly with) and then Ryanair will not last. Zero out of ten for me. If I could give a minus number I would for their customer service and for senior management for putting greedy, non caring and ignorant process and policies in place.
## 533 Stansted to Barcelona. Ryanair website would not let us check in, on arrival asked staff they tried to help but could check us in online either, got directed to the desk where I had to pay \302\24355 x 4 for 4 Traveler because of there computer systems, \302\24355 for a person to print a boarding pass = \302\243220. Then later got to gate and was told to pay \302\24325 for my luggage. Thankfully on my return fly I came back with Norwegian, a total contrast, they where willing to check luggage for free and had free wifi on plane, printed boarding pass with no extra cost. Ryanair are a cheap no frills Airline no customer service. Their response: Dear Customer, Thank you for contacting Ryanair. Checking in online and printing boarding passes up to 2 hours prior departure is compulsory for all our passengers, as accepted in Ryanair\342\200\231s Terms and Conditions for Travel at the time of booking. We make sure to remind our passengers in time about the online check in via e-mail as well. Passengers who fail to do so are subject to an airport check in fee of \302\24355 per way per passenger. According to the above I am afraid I have to advise you that we are not able to issue a refund on the airport check in fee you encountered. I trust that this has been of assistance. Yours sincerely, The Customer Service Team For and on Behalf of Ryanair.
## 534 Dublin to Amsterdam. Tried to check in online, but the website wouldn\342\200\231t let me type in the passport number box. Tried multiple times, in landscape mode, portrait mode, different WiFi networks, different times. Decided to show up to the airport early to get it taken care of. I was then charged \342\202\25455 euro for each ticket (two in total) to be printed. The woman asked \342\200\234Do you have an error message screenshot?\342\200\235 No I did not. I\342\200\231m a first time flyer with them, and never again after this fiasco.
## 535 Milan to Cagliari. Quiet flight and on time, we took a newly built Boeing 737-800. My flight experience is good but it is hateful when the hostesses want to sell you anything. Take-off and landing done well. Volo tranquillo ed in orario, abbiamo preso un Boeing 737-800 di nuova costruzione. La mia esperienza di volo \303\250 buona ma \303\250 odioso quando le hostess ti vogliono vendere qualsiasi cosa. Decollo e atterraggio fatti bene.
## 536 Amsterdam to Dublin. Was first at the check-in counter to get to the front to say we had to check in online and had to now pay 55 euros for a boarding pass. What an absolute joke. What other airline charges for the boarding pass? Isn't that what we are paying for?
## 537 Rome to Barcelona. Ryanair charged me to check-in at the airport for 55 euros a person which is almost more than the ticket itself. Then flight is delayed for 6 hours and staff don't know what is happening and if there will even be a flight. No one was there to help answer any questions and no reimbursement was given of any kind.
## 538 We flew Shannon to Malaga and after passing the boarding gate all passengers were sent outside to enter the aircraft. The distance from the gate to the aircraft was around 250 meters. As the ground staff asked us to wait 50 meters away from the aircraft as works were still ongoing we had to wait for 10 minutes in the cold and even when it started to rain they made us wait in the rain. When we finally were allowed, soaked wet, to enter the plane nobody apologized for this situation and stewards were blaming the ground staff. In addition the cabin was dirty, bread crumbs, litter, toilet dirty, just disgusting. I fly regularly with other low budget carrier but Ryanair is by far the worst when it comes to service. No customer service at all, not courtesy.
## 539 Barcelona to Palma. As stated by many, they will charge you (in my case $113 for 2 tickets) if you don\342\200\231t get your boarding pass 2 hours earlier. They told me that they had sent me an email but it was an email regarding being there 3 hours earlier and no email regarding check in. As most reviews point so many passengers get duped and get charged. I will not be using them again and may look into legal pursuit. The money is not the issue but the principle is.
## 540 Unfortunately I have no choice but to use this airline from Manchester to Shannon as they are the only airline available. They are by far the most unreliable airline I have ever used, I fly every 2 week and I can\342\200\231t remember the last time the flight was on time from Shannon to Manchester, it is delayed every time without fail, the flights have also gone up and I would much rather pay double the price and use a reliable airline and as soon as I have the choice to use another airline I will be doing. I am not sat in the airport waiting for another delayed flight, they assured the customers the flight will be boarding at quarter to as the flight it delayed, yet it is now ten minutes over that time, which is another blatant lie they tell the customers weekly, not only do they never leave on the stated time, they also never leave on the time they state the flight is delayed till.
## 541 Barcelona to Manchester. An unpleasant experience right from the time of booking the tickets. The airline is a joke. They charged extra for baggage. And again 110 euros extra in the airport to issue boarding passes, as we had not checked in 2 hours prior to departure. Not encountered this with any other airline. The tagline says Fly cheaper, however I found the airline to be "really cheap", and tickets very expensive. Would advice to give this airline a skip.
## 542 The flight was delayed 3 hours. We were kept in the airplane for this time. Cabin crew were useless, they did not provide any information. When someone told them that it is not ok not to say anything about the delay, they answered rudely \342\200\234you were happy when you paid the cheapest ticket on the market, now face the consequences\342\200\235. I will never fly with Ryanair again.
## 543 Bordeaux to Copenhagen. The flight was late. Cabin bag policy is inconsistent. Staff are cold. Rules are made to apply as many extra charges as is possible. I am used to flying with Ryanair, used it for the past 7 years, and do not expect luxury. But the quality of service gets worse and worse.
## 544 Athens to Santorini. Don't book your flight with this airline. This airline charged us 274 euros for the boarding pass and baggage on top of our flight. A rubbish check-in policy that only allows you to check-in online until 2 hours before the flight or else you\342\200\231ll be fined. The policy was not stipulated or highlighted on our booking confirmation. Aside from that, we were charged extra for bringing hand small trolley as they only allow small bags.
## 545 Cologne to Marrakech. They hide their 50 dollar crazy fee to just get a boarding pass at the airport. Will never fly with them ever again.
## 546 Paphos to Stansted. Only had one flight with Ryanair that was on time, the other 5/6 typically an hour late. Poor, inconsistent customer service and rude staff, charged \342\202\254100 for cabin bags just to end up in hold, whilst other tagged cabin bags were allowed to be kept on. Customer satisfaction is not a priority for Ryanair
## 547 Copenhagen to Stansted. Ryanair is a cheap airline that rips you off for everything possible. We are family of four travel back from Istanbul, unfortunately, the last leg was Ryanair from CPH. This review may be useful for other readers not to get caught by Ryan Air at the gate where they completely rip you off. Firstly when they allocate the seats while we were on holiday they put the family members in completely different locations so to get seats allocated to sit together you need to pay \302\2438 per seat. My 12-year-old daughter when her birthday still in December they say she is 13 and need to sit on her own. We got the boarding pass while we were on holiday by kiwi.com and boarding pass says, if you need to carry 2 cabin bags you need to buy priority but one cabin bag is allowed and standard sizes are mentioned. In the checking desk, they check your bag says only small cabin bag is allowed which is much smaller than the standard size and ask you to pay 25 Euro per bag that is Euro 100 for my family. I should have easily got much better airline for that amount of extra money. So readers, do not fly Ryanair they will con you to your last penny to make money. You can just pay a little bit extra and have a good flight with no headache. I was travelling the same trip with Pegasus and Jet2.com airlines and we did not have any issues at all.
## 548 Dublin to Berlin. What a stupid move on Ryanair\342\200\231s part to purposefully seat passengers travelling together apart unless they pay the extra fee to choose seats. Recently travelled with my husband and we were assigned completely different seats even though the seat next to him was empty! First airline I\342\200\231ve experienced that\342\200\231s done this. What a money grab.
## 549 Leeds to Faro. Terrible as always. I avoid this airline like the plague but a friend booked this trip. Use Jet2 if flying from Leeds. This airline always finds a way to charge more. \302\243260 for boarding cards last time after their site went down and we were still charged. A confusing bag policy this time meant our whole group of 7 apart from me was charged extra for bringing hand luggage.
## 550 Stansted to Rome. Awful. Changed my flight (3+ hours) couldn't offer another flight on same day so suggest I move my holiday dates even though explained accommodation booked. Transferred my details wrong when eventually switched flight and then got charged \302\243115 even though I did not change they refused to accept. No complaint number to ring direct. Just state to complain via form. Loads of people have had problems with Ryanair's system incorrectly name saving but they refuse to take responsible.
## 551 Leeds to Ibiza. We paid \302\24330 extra for priority baggage and boarding, then got told by the rude supervisor that if I didn\342\200\231t pay an extra \302\24350 for my case as it didn\342\200\231t fit in the metal box. I wouldn\342\200\231t be allowed to fly, the supervisor was rude to numerous passengers on the flight not just us.
## 552 Santorini to Athens with Ryanair. I got to the airport in Santorini 2 hrs and 45 minutes prior to the flight we were unable to go in until the flight was open 2 hrs prior. At that point was told we had to pay for the boarding pass. I had no internet service and was unable to read the notice or check in online prior to arrival. It was just the fact that we had to pay Euros 68 for a boarding pass, it is the actual policy that exists that someone has to pay that amount because they were not able to check in online and print a boarding pass while on a vacation. After travelling on several airlines prior and enjoying a fantastic vacation, it was absolutely disappointing to have to spend that money. It was like buying a ticket all over again. No one should be subject of that kind of treatment /stress while on vacation.
## 553 Budapest to Prague with Ryanair. I have travelled with them many times and 10 kg cabin suitcase was always allowed. Now they excluded this and I didn\342\200\231t realize that so I ended up paying extra 25 eur for my small suitcase that had to be checked in. In Budapest I had non priority and they had two lines and they didn\342\200\231t allow people to mix lines-stricly priority one line non priority different line. However, on my way back I paid 15 eur online to have priority ticket-turned out that now I cannot check my suitcase in but I have to carry it to the plane. From Prague there weren\342\200\231t two lines so even though I was priority I was waiting in the line again. Finally, the flight from Prague to Budapest was more than one hour late. On the plane I bought a tea for 3 eur, of course, they didn\342\200\231t give me a receipt. Seriously a disaster airline company.
## 554 Mallorca to Edinburgh. Absolute shambles of a service. I understand Ryanair is a budget airline that operates between fine margins but even so it is unacceptable the frequency of which this airline\342\200\231s flights are delayed. Legroom on these aircraft is a joke with no adjustability which results in a very uncomfortable journey. Only positive is the price.
## 555 Rome to Paris. Hidden fees You have to print your boarding pass ahead of time or else pay an extra 50+ euros for your boarding pass at the airport, which we tried to do but couldn't because the Ryanair website kept on crashing. I even called customer support, and they told me not to worry about it, but to just show up at the airport at the usual time and tell them about my tech issues. What a lie this was; when I showed up I was told I had to pay up along with everyone else who couldn't or didn't print their boarding pass. The 1.5 hour flight was packed with flight attendents moving up and down the tiny aisle, selling things at the top of their lungs. When I asked one of them a question about the flight, they were rude and short with me, unsmiling. Uncomfortable seats. The terribleness of this flight was endless.
## 556 I traveled from Athens Greece to Sophia Bulgaria by Ryanair and due to internet issues I could not get the boarding pass. At the airport I was denied to travel and was forced to pay 55 Euros to get the boarding pass. This was a big blow and jeopardized my traveling budget too. I have travelled to more than 35 countries with almost all the airlines, but this happened for the first time. This is clear cut loot and black trick for Ryanair to make money. It is mandatory by the airlines to provide boarding passes online or offline. But this was the most bizarre experience. I have decided not to travel this airline again who squeeze money from the passengers, which is their right when they by the airline tickets.
## 557 Stansted to Porto. I was worried about the strike dates. The airline did a great job and flight took off as per schedule. I have travelled with Ryanair a few times and the staff are very courteous, seats are great for short haul and overall service is as it says on its website. I will use Ryanair over many other airlines. Well done and keep up the good work.
## 558 Stansted to Knock. Missed our flight due to the long queue at the service desk alone. Can\342\200\231t understand the use of electronic boarding pass when they don\342\200\231t have stalls where you can self drop off your baggage, unlike any other airlines. We were a family of five with a baby and we\342\200\231re frequent flyers. No one assisted us - have to carry our luggage back. We were tired from walking a long way to the gate rushing at Stansted airport. Our sole check-in luggage was not refunded \302\24325 pounds that we claimed back because we ended up flying another airline going to Ireland. Rude service desk even to the manager not hearing our side. Wouldn\342\200\231t fly again. Please avoid them. I didn\342\200\231t believe other people reviews but now I totally regret it. Just very poor service.
## 559 Barcelona to Cardiff. I have never experienced such a terrible flying experience than I did yesterday, 27th August with Ryanair. Firstly from having to pay \342\202\254110 for not checking in online. Then greeted at the departure gates at 8:45am and not being allowed to board the plane as the \342\200\234gates were closed\342\200\235. We were then told to go to the Ryan Air office and when we asked where it was located we were simply told \342\200\234downstairs\342\200\235, no directions or help offered and we were expected to carry all of our luggage back to the very entrance of Barcelona airport. When we got there, there was quite a long queue for the Ryan Air desk. We were told that they couldn\342\200\231t do anything for us as there were no flights available until the 31st of August which would have meant waiting 4 days due to a strike. Therefore we had to travel to another airport an hour away from there and board another flight with a different airline. We were not offered any compensation and I am disgusted with the service we received and it is safe to say that they have lost our custom as we will never use this airline again. Not only did we lose out on the money we payed for the original flight but also the money we had to pay for the check-in service also. Every member of staff we dealt with from this airline yesterday was extremely rude and all hold terrible customer service skills. Also we were held up by having to pay the check-in fee and issues with the facial recognition machines.
## 560 My husband and I attended a wedding in Tuscany and had bad experiences on both our outbound and return flights from Stansted to Pisa. Ryanair staff in both Stansted and Pisa, were extremely rude with multiple passengers complaining about a rude member of ground staff from our outbound flight from Stansted. Ryanair have a policy where you must to pay a \302\24325 charge if you choose to bring a small roll on luggage for which there is ample room for and can be easily stored in the overhead locker on the aircraft. The \302\24325 is due if you do not pay for \342\200\230Priority boarding\342\200\231 that allows you to carry on a small bag and roll on luggage for \302\2438 ; for which there are only a limited number of spaces available and is almost always sold out. My husband was required to pay this fee and was also told by a member of staff, that he has been ignorant and had obviously \342\200\230ignored\342\200\231 his emails - which was not the case. If not there is the option to check in a 10kg case for the price of \302\24320.40 each way. Which amounts to \302\24340.80, for only a long weekend away. Apart from the extra costs that were not clear to me on the Ryanair website or app. As we were at Pisa airport and boarding the plane I was given a telling off from one of the Pisa Ryanair staff for trying to assist them as we were one of the last to board by attaching the luggage tag to my husbands small roll-on luggage after we had paid the \302\24325 fee for it (that we would now have to wait for at the baggage carousel at London Stansted airport, despite finding out that there was more than enough room for it inside the overhead lockers when we boarded the plane) and repeatedly asked \342\200\230Why, Why, Why?!\342\200\231 I had possibly attached the tag to the bag, which is completely acceptable in the UK, to which I responded that \342\200\230I was trying to help as I could see they were tight on time\342\200\231 and told firmly \342\200\230not to do it, that is not good and Why would you do that?\342\200\231. We are disgusted by the way we have been treated by Ryanair staff and by all of the extra costs that were added. We were drawn to the airline due to the flights being the cheapest at the time, however would rather pay more for a professional, courteous service without the extra costs. After calculating these costs, e, this worked out as more expensive than other airlines that we did not book with due to the fact that Ryanair seemed cheaper. Please, do your research before booking with this airline and if you would like to be treated professionally and in a courteous manner and avoid paying for things that should be and are included with other airlines... then do not book with Ryanair. As they may advertise themselves as the low fares airline, but it adds up in extras!
## 561 I flew out with Jet2 the service was fantastic. I unfortunately flew back with Ryanair. We arrived at the airport 2 hours before departure and went to check in, the staff advised we had to check in online or we would be charged \302\24355 per person. I checked correspondence from them via email and I cannot see this displayed. If this is the case then what is the point of them then making everyone queue up. I had a small gym sports bag but because it was an inch over the guideline I was then billed a further \302\24325. Myself and half the aircraft were passed from desk to desk from rude and unhelpful staff. Finally when I was at the last stage of being sorted and my family were \302\243320 down between us the woman on the desk decided to have a full blown gossip with her colleague and take over 15 minutes to sort our boarding passes, I had to ask her to hurry up as we were about the miss our flight! The aircraft had spare seats everywhere but they put me and my family across the whole plane and sat us alone even thought they could easily arranged us to be sat together. I paid \302\24390 going out with Jet2 and ended up paying \302\243275 for a one way flight home with Ryanair.
## 562 Bristol to Venice. I'm only attempting to complete the abysmal check-in process for the wife. I repeatedly get a 'Check-in timeout' and can't help suspect this is a Ryanair ploy to extract more money later.
## 563 Barcelona to Liverpool. Worst airline I have ever used, I flew to Barcelona with Jet2.com who were fantastic. On the way back I travelled with Ryanair who were terrible. They have introduced a baggage policy, which is a money making scheme, they\342\200\231ll charge you for a small suitcase, should it have wheels, even if it meets the measurement criteria for cabin luggage. Other passengers had larger luggage but as they didn\342\200\231t have wheels and they weren\342\200\231t charged. This should be made clearer upon booking! Finally, they employ the rudest staff who were not at all helpful. I will never use them again
## 564 Stansted to Paphos. I don\342\200\231t normally write reviews and didn\342\200\231t think I would ever write a positive one about Ryanair. However I feel I should give credit where credit is due. Flight out to PFO from STN was smooth, on time, and it even felt like I had sufficient leg room (I\342\200\231m 1.82m in height). We were worried about getting back to STN on the 24 Aug because of the pilot strike. But I have to say the return journey was good, left a little late due to congestion of airspace but similar experience on the flight back, smooth running. So as I say credit where credits due.
## 565 Warsaw to Stockholm Skavsta. We had an average flight on Ryanair. Very cheap ticket. As for a cheap airline, the staff didn\342\200\231t care and they were sitting on their seats and doing nothing. Legroom wasn\342\200\231t that bad. If you don\342\200\231t want to overpay, Ryanair is good for you, but it would be impossible to last on Ryanair on a 5 hour flight. Travel with them only on maximum 3 hour flights.
## 566 Alicante to Liverpool. Awful experience at the airport, queued for the full 2 hours at the airport. Passports checked 3 times. No time for a coffee never mind breakfast. Get your act together Ryanair!
## 567 Barcelona to Edinburgh. An airline which ends up costing more than everyone else by the time you add the extras on. Purposely splits parties up unless you pay extra to choose seats. Staff look a mess, rude and unprofessional.
## 568 Budapest to Edinburgh. I have never flown with Ryanair before, and I can see why they are a 'cheap' airline. I also hope not to fly with them again. Very unfriendly staff who looked miserable from start to finish. As an anxious flyer, a smile can make all the difference. Absolutely no room on the aircraft, felt like a pack of sardines, virtually no comfort. There were a group of men drinking beer standing at the front end of the aircraft for nearly the whole duration of the flight which I thought was odd and unsettling. Also, you can not hear what anyone is saying on the speaker, pilot or cabin crew. The worst part was the heat! Aircon was useless and it seemed that everyone has was struggling with the heat. Would not recommend this airline, particularly if you are an anxious flyer!
## 569 Manchester to Rhodes. Ryanair is by far the most atrocious, extortionate budget airline out there right now and here are three reasons why. They\342\200\231ve introduced a completely senseless baggage policy, that amounts to no more than a money making cheat scheme, they\342\200\231ll charge you for a small suitcase, should it have wheels, even if it meets the measurement criteria for cabin luggage. They\342\200\231ll separate two companion travellers, despite them having booked their tickets together, as a means of forcing people to purchase reserved seats. 3) Finally, they employ or train the rudest staff (in my experience - and I have travelled widely), because they respond to complaints with an utter lack of empathy. So, I\342\200\231m afraid I feel obliged to leave this scathing review and I can only hope that Ryanair will take heed and change for the better.
## 570 Faro to London Southend. I cannot stress enough do not fly with Ryanair. We paid for priority boarding. There was no sign of priority boarding, it was a complete free for all when it came to getting on the plane from the holding area at the gate. There was an issue to the rear of the plane, everyone waiting to get onboard to the rear were left airside by the runway for around 30 minutes with no explanation while the front continued to board. We paid extra to book seats so we could all sit together as we have 3 young children. Got on the plane we found 3 of our 5 our booked seats were ripped up. We weren\342\200\231t told as we got on the plane there was an issue and there were no signs on the seats, when we asked what was happening the flight attendant was rude and said the reason they were like that was they were obviously out of use and he\342\200\231d have to find somewhere else once everyone else was sat down. I had to stay in our 2 of our booked seats with my eldest and my wife had to sit at the front of the plane away from me with my two youngest on her own. It was a really bad end to our holiday. I contacted Ryanair customer service to complain that two of the key services I\342\200\231d paid extra for on our return flight hadn\342\200\231t been fulfilled, the customer service advisor was rude and arrogant and advised me in their T&C\342\200\231s you accept at the end that basically they can remove priority boarding and booked seats without explanation and we accept that when booking even if you have paid extra for it. Awful company. Steer clear. There are better budget airlines. Having flown with EasyJet & BA many times over the years I\342\200\231ll be sticking to them in future. Would give a rating of zero here if it were possible.
## 571 Manchester to Belfast with Ryanair. We had to change flight and they charged me 150 pounds to change a flight which cost 50 pounds, not to mention the 40 pounds I was charged to make the phone call to their customer service team. I had to make 5 phone calls as 4 times the customer service person deliberately hung up on me, which I assume also helps the boost revenue on their premium phone line. Unbelievable. Also they put my child in a seat away from me, even though by law a 6 year old should be seated beside an adult. Do they now expect to charge people for what they are required by law to do? I then had to listen to a flight attendant scream at two passengers because they were not paying full attention to her while the did her life vest demonstration. Her exact words were \342\200\234if I have to do this you will pay attention to me or I will remove you\342\200\235. I don\342\200\231t think a flight attendant has the power to force a passenger to watch her do the demo or through them off the plane. I also think they would do better to learn some customer service and respect. Disgrace.
## 572 Faro to Bournemouth. Terrible customer service, very rude staff. The air hostess made my trip very unpleasant after making a scene when I asked if I could move seat at the start of the flight into a spare seat closer to my group party. The airline did not sit any of us together on either flights and there were people in similar situations and spare seats dotted around. I am never flying with Ryanair again, I am appalled at the awful customer service. The best thing about both flights was getting off at the end.
## 573 Exeter to Malta with Ryanair. When booking this trip it automatically reserved seats for myself and 3 children, 7,5,1, but did not for my wife. Why separate us? 3 children which includes an infant on the lap for one adult is impossible, when one has possible ADHD and the other autism. I have had to pay for my wife to sit next to us, it's disgusting. This company has no interest in it's customers, just money making.
## 574 Belfast to Alicante. Never have I travelled with a worse airline. I would never recommend them nor ever fly with them again. When we arrived at the airport we were told are cabin bags weren't the correct size, (even though they are cabin approved) we were told there policy had changed and were charged \302\243100 for four cabin bags before are holiday even started, we were then told it would cost \342\202\2548 each for the way home which turned out to be another \302\243100. We had already paid \302\24388 (on top of the cost of are flights) to pre book our seats so we could sit together but then to board the plane and a lady who refused to move was sitting in one of the seats. On our way home we were sitting in front of two very drunk passengers who boarded the plane like that and were served more alcohol the whole flight by the cabin crew (who couldn't bring a lady beside me a spoon to feed her baby for an hour because they were busy) and began to smoke a e-cigarette which cabin crew could see and smell but decided to turn a blind eye. The seats are very uncomfortable, The staff very unhelpful and the flights both way were very unpleasant.
## 575 Barcelona to Santander. I am very disappointed I have to wait for more than 1.5 hours. After that they did charge me for cabin luggage that weight less than 5 kg. The prices are not transparent and they try to trick you all the time charging you extras. Be careful! I think Ryanair is the most dodgy airline that I have ever flight with.
## 576 London (Stansted) to Malaga. Ryanair was the worst airline ever. They charged us twice for checking in a bag. When we tried to tell the customer service, she didn\342\200\231t want to hear us and was very aggressive and didn\342\200\231t give us our money back. I sent tickets about it but they said that they don\342\200\231t do refunds! Besides, we were stuck in a line, standing, for about an hour waiting in line to enter the plane. I don\342\200\231t recommend it at all. I used 9 other airlines or maybe, more than 9. They were all very professional and polite and never charged us twice for anything.
## 577 London to Athens with Ryanair. Terrible customer service. Paid \302\24355 for airport check in while airline\342\200\231s staff members were slow and rude. No value for money there whatsoever. Just appalling. Usually flying out from Heathrow. First and last time using this horrendous airline. Avoid.
## 578 Lisbon to Stansted. I had to get Priority for this flight like every other flight. But the enjoyment standing in queues is very enjoyable (not). The staff at Lisbon airport were appalling but the Cabin Crew were alright. The flight was also delayed half an hour which is quite annoying. Their was a bad descent into Stansted. If you can at any costs, avoid this airline.
## 579 Very confusing policies for documents, they seem to vary by airport and ryanair has no consistent policy. Charged 20\342\202\254 per person in order to print off boarding passes which were previously provided free at Stansted airport. They exist purely to rip off passengers for more money.
## 580 The website was easy to use and the different levels of charges clear to understand. I booked my ticket to Kerry a good few months before my trip and was pleased with the helpful emails prompting me to check-in online. The bag drop at Luton was quick and efficient with one staff member going out of her way to help a large group of Chinese students and their teachers. The staff member overcame language barriers and was efficient and very hardworking. Boarding was relatively efficient and quick. The flight was pleasant and the cabin crew worked hard to sell a range of snacks and drinks. Safety was taken very seriously as one would expect. On this flight Ryanair provided excellent service. I hope to use Ryanair again in the future!
## 581 Stansted to Rabat. Very rude lady in charge of the crew. As if it was not enough we had 1h 30 delay inside the plane with no explanation, check in luggage put in the aircraft with no labels. They unloaded luggage and brought them inside the plane to ask who it belongs to, appalling! Very poor service.
## 582 Dublin to Hamburg. When checking in I had paid for 1 x luggage and had two extra bags. I asked the check in person if the other two bags would be be allowed online and she said sure no problem. As I was getting assistance with wheel chair to the plane. The lady who was helping me said that the two bags may be a problem (will need to pay more) and she said I should double check. So we went back to the same lady and asked again. This time she said that it would not be okay and we would have to pay 25\342\202\254. I reminded her what she said last time about the two bags being okay to bring onboard, but she denied saying that and then started to argue with me. I stopped talking to her as she was very rude. She then kicked me out the line and said I need to stand in another if I need help. Eventually I spoke with another Ryanair lady who was very kind and explained what had happened. And helped me with a free priority ticket to make up for the bad experience. At the end it worked out. I just wish there was consistency in the staff and that the staff would treat us like customers and not cattle.
## 583 I have nothing but praise for Ryanair! The website is user friendly and the airline sent me reminder emails to check-in. The staff at Luton airport were friendly, well presented and helpful too. A large group of Chinese students and their 2 teachers were having problems communicating and one staff member went out of her way to make them feel at ease. This was nice to witness and a great credit to the airline. Boarding was well managed and orderly and during the short flight the crew sold snacks. The captain provided suitable information. No complaints from me at all. It was a a very positive experience.
## 584 Budapest to Rome. A pleasant surprise! For this price margin, I am happy with the service Ryanair provides, and I'm a nervous flyer. In fact I would choose this airline again at the expense of some other low cost airlines and/or flag carriers. The flight - and cabin crew is safety conscious and efficient, I exchanged pleasantries with the mostly hungarian crew upon leaving the plane as well. I think being nice to the crew goes a long way, as they are working hard with very short turnaround times. The seats feel more like jump seats but that's ok for a short haul flight. Don't have any comments on the catering as I didn't have the need to use it. The ground service varies between airports - the priority boarding is perhaps not worth the money so much as some people still end up cutting the line. Ryanair's website is a bit hard to navigate, if you want the best deal and don't want to pay for pre-configured extra packages. Overall I was pleased with my trip, the return flight was a super smooth landing, too, after a bit of turbulent weather at cruising altitude.
## 585 Rabat to Madrid. I\342\200\231ve had worst experience with airline ever first delayed for 1 hour. I had to pay 69 for not checking in and 30 pound for hand bag which add up to the original price wasn\342\200\231t comfortable. I don\342\200\231t recommend Ryanair to anyone, if you don\342\200\231t have choice look out for the hidden fees.
## 586 Faro to Bristol. We estimated that our return flight was our 50th with Ryanair over the past 10 years and in that time have had 1 delay of an hour due to ATC and 1 delay of 4 hours where we received the statutory compensation within 10 days. Staff are invariably pleasant and, unlike some airlines, will help with baggage. Seating is just about OK for 2 - 3 hours and improved on the newer aircraft. We have never had to pay any last minutes charge because we read the terms and conditions unlike the majority of people who complain ! Ryanair are an efficient and certainly not luxury means of travel but we are very grateful that, because of their low fares we can visit our family in the U.K. far more often than in the old charter flight days.
## 587 Beauvais to Vilnius. First time flying Ryanair It's been an educational experience. Attempted to use the Ryanair check in online and was unable to complete it. We arrived at the airport and were told we must pay \342\202\25455 each to check in. This is beyond absurd.Even when you check in online with Ryanair you are required to speak to an agent to check baggage or verify your carry-on and verify your ID. So there is no benefit for the company other than an opportunity to gouge first-time customers who are unaware of this policy. Pathetic and petty.
## 588 Gatwick to Vienna. I was a solo traveller and I had to face a 3 hour delay at the terminal. Now this made me feel angry as I was missing out on my friend's wedding in Vienna, Austria. Also something to mention, the cabin looked messy. I had to sit on bread crumbs. What a terrible experience.. I can't recommend this airline to anyone however, you have to deal with what you got for a low price.
## 589 I was booked to fly on Aug. 2nd from Athens to Luton. The day before I contracted a contagious virus causing severe diarrhea and vomiting. I called up the airline trying to change the booking to a later date and they told me that it was not possible and that I had to fly that day. I had to buy another ticket but dread the thought that maybe some day a person with a contagious virus might be sitting next to me.
## 590 Stansted to Brno. I was expecting an horrendous experience, but the flights there and back were fine. Ryanair's pricing policy, and what you can optionally pay for, is transparent. The basic fare is incredibly cheap, but once you add any extras, such as luggage, extra legroom, self-assigned seating, and so on, the price rockets, and the airline is quite clear on this. It's also clear on luggage restrictions, and penalties for not checking in online. My main criticism is that boarding, especially at Stansted, was chaotic: queuing down a stairwell, and then waiting a good 10 minutes on the tarmac in blistering heat. Why doesn't boarding begin when the aircraft is ready? Seats OK for a short-haul, cabin staff did their job. The experience on Jet2 and EasyJet is better, but Ryanair did what its tin promises.
## 591 Stansted to Aarhus. Arrived and checked in very easy in Stansted. I was a little overweight with my check in but the staff member didn\342\200\231t say anything. Was very pleasant. However had I have been charged then I would have paid since I know the luggage limit - as does everyone else. Flight said delayed by 50 mins. But then suddenly that was taken away & we were no longer delayed. Took us by surprise we had to dash to the gate. Didn\342\200\231t weigh my hand luggage which was allowed to 10kg but it was actually about 15kg. Which I would have sucked up and paid had they weighed and told me. Since it\342\200\231s my problem not there\342\200\231s. They lay it out very clearly what the limit is so I don\342\200\231t know why people complain at being charged extra. Flight arrived in Aarhus on time after taking off ontime. Bags were on the belt after passport control. Flight coming in was very very bumpy due to the weather but the pilot did very well to land so smooth. Flight home from Aarhus was again on time and actually arrived about 25 mins early. So we must have had good wind on our side. The leg room is minute. I am 5\342\200\2317 and pretty chubby & it was a struggle for my legs. My knees got bashed every time the person in front moved. The seats are ok, since Ryanair are a short haul company no one is going to break their backs on the seats. Friendly staff and a good clean cabin. Not dated like some airlines. I am terrified of flying but felt no more unsafe with them than I do with everyone else. My flight was about \302\24325 return and baggage was \302\24330 each way - similar for all baggage costs. You\342\200\231re not going to get free food, alcohol and entertainment on a 1 hour flight for this cost. They shouldn\342\200\231t get such a bad rep since the staff are nicer than some airlines I\342\200\231ve been with.
## 592 Knock to Bristol. Back and forth to the West of Ireland, all went smoothly, on time arrivals, all for less than \302\24375. I left it late to check in on line, must have had 5 reminders by text and email, all warning I was liable to extra charges if I didn't do it soon. I am a frequent flyer so I know the rules, but they are pretty clearly spelt out when you book the tickets.
## 593 Budapest to Prague. Worst airline I've ever flown with. It may be cheap when you see the tickets, but the price will only go up if you want a comfortable flight with luggage, a seat and even food/drinks. Last week I had a delay of 4,5 hours and the airline does not offer any service, no explanation, no compensation, not even some water. If i wanted a bottle of water, which is kind of normal if you have to wait 2 hours inside an aircraft, I had to pay 3 euros for it, really absurd. My recommendation is to spend a little extra and fly with a normal airline and fly a lot more comfortable and relaxed.
## 594 Birmingham to Barcelona. A total rip off! Apart from being over one hour late from scheduled time, I got charged an extra 25\302\243 for having a hand luggage of a size of a backpack (and had no hand bag!!!). Once onboard, I noticed half of the aircraft was empty and had loads of room for hand luggage! The plane wasn't even cleaned between two flights and had to sit on top of potato crisps and empty bottles. Scandalous.
## 595 Strasbourg to Stansted. We were unlucky to have an aborted take off due to possible bird-strike and the plane returned to stand. The pilot kept the passengers and cabin crew well informed when on the ground, even connecting the APU to keep us comfortable. It was decided that we should disembark with all hand luggage whilst an engineer was called to inspect the engine, and for any damage to be repaired and then signed off. This did take some time, and passengers were required to wait in the gate departure area until the Police des Fronti\303\250res had given permission for us (as a 'departed' international flight) to move into a larger area where there was a caf\303\251. 5 \342\202\254 vouchers were issued and the caf\303\251 coped well with an additional and unexpected 189 passengers who were on the ground for over 3 hours. The only frustrating part of our time in Strasbourg was the time delay in getting the permission from the Police des Fronti\303\250res and the lack of information ... not the fault of Ryanair, or the airport, which is an outstation without official Ryanair base representation only efficient and pleasant subcontractors. Ultimately engineers arrived and inspected the engine. The aircraft was signed off as safe to fly and we re-boarded with the same crew. The flight back was safe, uneventful and everyone was glad to be home. It is very easy to knock Ryanair for various aspects of their terms and conditions, but when it comes to safety they are second to none, and the responsible action by the flight deck, even though it involved a wait, shows what really matters in safe travel these days. And no, even with 'bird scaring' patrols, there is no guarantee that the little blighters will not come back to the same spot once the vehicle has gone. Well done Ryanair, for putting the safety of the passengers (and themselves!) first.
## 596 Stansted to Shannon. Their online check-in kept giving my girlfriend and I errors every time we tried logging in to complete check-in. We figured we'd just do it at the airport because the site said we can check in with them up to 40 minutes before departure. Upon arriving to the airport, they wanted \302\24355 each to complete check-in! The rude customer service representative in Stansted informed us that it states so in their "Terms and Conditions" but it isn't clearly stated on their site. Their site makes it sound as if it's a convenience while conveniently forgetting to mention the \302\24355 charge. This is the last Ryanair flight I'll ever take. I'd rather pay more money to make sure they don't get my business.
## 597 Barcelona to Rome. I had a terrible experience with them and they have many hidden charges. I had to pay more than my actual ticket fare and there were other people paying for things they didnt expect. They have terrible service too.
## 598 Leeds bradford to Dublin. Terrible company, avoid if possible. They do their best to trick you into paying more than the advertised price at every opportunity. When their plane has technical fault, no information given.
## 599 Gran Canaria to Stansted. Ryanair is now just a complete joke and pretty identical to the airlines depicted in come fly with me. Working out whether you\342\200\231ve paid for luggage or not is deliberately unclear and I\342\200\231d paid for only one way. You are deliberately seated apart, regardless of when you check in so you have to pay to sit together. Over two thirds of the plane had paid for priority boarding that comes with hand luggage so the queue was as long as if they hadn\342\200\231t. The team are completely disorganised and ended up rushing through on both flights despite not having to wait for any passengers, to avoid the departure slot. If I had a pound for every time someone arbitrarily needed to \342\200\234see\342\200\235 my boarding pass, without actually viewing it, I could\342\200\231ve saved the \302\243100 of additional hidden baggage fees. Over \302\243700 pounds to take a small hand luggage each and to have the audacity to want to sit with my partner in the equivalent of a supermarket deck chair. This is not budget. At all. I flew to four destinations in the states last year, totalling six flights and that cost \302\2432k. They\342\200\231ve monopolised the European destinations and have taken over airports so now they can charge whatever they like. If it\342\200\231s in any way possible to get some European sun without using them any more, I will try my damnedest. Avoid like the plague.
## 600 Billund to Manchester. I'm a veteran flyer, but this week's flight was my first experience with Ryanair, and will be my last. The website, which I tried to access from my cell two days before the flight, would not allow me to complete check-in. When I got to the airport a little less than two hours before the flight, I was charged an extra $95 for not checking in early. A male flight attendant was quite rude to me, and I did not do anything to warrant that. He seemed more interested in chatting up the female flight attendants than helping passengers. Once a passenger has booked a ticket, which I did months in advance, they e-mail you every day with annoying offers and irrelevancies. I did not unsubscribe because it would have prevented me from getting important flight updates. On the plus side, the plane was fairly new, the other cabin attendants besides the man were pleasant and the flight left on time.
## 601 Stansted to Arrecife. So, the flight was slightly cheaper than EasyJet, and the times were better, so I thought it was a good idea to give Ryanair a whirl, but then I realised at Check in that we had to pay to sit together. It didn\342\200\231t bother me whether we did or not, so I didn\342\200\231t bother with that, but couldn\342\200\231t then check in until 48 hrs before the flight and had to print my boarding pass (eboarding pass not available). So, effectively, unless you are going somewhere with a printer, or for less than 48 hrs you had to book seats ahead, and therefore pay for them on the flight home! Then, as the tickets weren\342\200\231t priority (?), we had to pay for our bags on the way back (5 x \302\24325 = \302\243125 + \302\24339 for the seats added \302\243164 onto our bill). On top of this, the staff talked to us like we were stupid. Another customer, who was having the same issue was furious, and the staff were equally rude to him. To top it all off, the flight was delayed by half an hour without a mention or apology, the air hostess told us we had to give her our rubbish half an hour before landing or take it home, as she wanted to get home too! And then the luggage handlers broke one of our cases after paying for the privilege of putting it in the hold against my will. I fly regularly (mainly around Germany) for work, and I have never had these issues. Definitely sticking to EasyJet for this route. Ryanair reminded me of fawlty towers.
## 602 Pescara to Stansted. Ryanair used to be a good airline company but not anymore. Flights are getting much more expensive, airplane very uncomfortable, staff ok but they can definitely improve. One thing that i like is the fact that they stopped boring people to sell stuff. (Not as much as before) so you can have a nap. My biggest problem is always the delay, is now 9 years that i use Ryanair which is the only company to serve my city and i never had a flight on time and i think it says it all.
## 603 Birmingham to Chania. Awful dirty airplane, totally disinterested staff, aircraft was an hour late leaving even tho we were all boarded on time, and then they damaged our luggage and refused to replace it because we didn't report it at the arrivals hall, largely because it was half midnight and no one was even at the desk Have flown with them before through work so knew they were bad but this was the first time buying my own ticket and it'll be the last. Most people dont realise by the time you've paid for your allocated seats, paid for check in and paid for cabin baggage they aren't any cheaper than anyone else anyway
## 604 Edinburgh to Dublin. Horrible customer service! Bag check in staff was all making small talk with one another instead of helping tell customers where to have our bags and passports checked, and helping the line to move along. Then when we got to our gate they kept switching gates on us and had people trampling over one another to move from one gate line to another and the staff was laughing as older customers were getting pushed out of their lines. It was as if the staff thought the process was a joke and didn\342\200\231t help keep customers in their original lines or give accurate Information in a professional manner to the customers. Very unprofessional and disrespectful to customers. Felt like they treated us like cattle!
## 605 Barcelona to Rome. When I arrived at the airport I learnt that I have to pay for check-in because check-in must be finished online before 2 hours the flight. So we paid 110 euros for that. I was on honeymoon and our seats were not together. We have learned that many of the passengers were in the same situation. Then during the flight, many times the crew sold things. Firstly they were announcing and then they were starting to sell. I tried to take a nap but three times I have been woken up by these announcements. I have taken many flights but this one was the worst.
## 606 Dublin to East Midlands. Terrible service, terrible policies. You get what you pay for I guess but seems that they have unreasonable pricing strategies that target mistakes even ones made by the airline. The way they deal with objections is beyond rude.
## 607 Luton to Faro. Do not travel with family as it\342\200\231s hidden costs will take you down the hole for budget. We had to pay 55 Pounds each for a family of 5 because we didn\342\200\231t check in online. We paid 275 Pounds up-front before they would talk to us. Plus I tried to call the airline via phone and no one answered for 30mins and we were going to miss the flight otherwise. The reason we couldn\342\200\231t check in earlier is because of our 1 child under 10. Pretty sad way to start vacation as we are Canadian and have never experienced this type of rip off at any airport with no customer service care at all! No Ryanair staff and had a third party to sit there and keep saying that you need to read the fine print. Never recommend this airline as it\342\200\231s the worst I have ever been on and I travel quite a bit for business and family trips.
## 608 Manchester to Dublin. The first flight of the day. Efficient and straightforward service, as expected with Ryanair for \302\24314.99! I always recommend Ryanair as a budget option, and I always get what I pay for.
## 609 Evening flight back to Manchester. Efficient and fast boarding, and as ever, Ryanair is a bus with wings, which is all I need for a 35 minute flight at \302\24314.99!
## 610 Bucharest to Dublin. The check-in opens a few days before the flight! When you try to buy the Priority there are no seats! Rip off at the airport to take the bag with you! Their size bag is smaller than other companies! I flew due an emergency not a holiday or pleasure but still needed to get a small bag with me! Why advertise small prices if you are not allowed to bring than just a hand bag?
## 611 Porto to Barcelona. On 7th June 2019 there was an issue with the airport radar which had a knock on effect on several flights. I can understand these kind of situations can occur, but what is not acceptable is how they handle them. My flight was at 7pm and only left at midnight. Since I like to arrive earlier, I was in the boarding area since 5pm. There was no one to hep us, not from the airport or from the Ryanair, no information, no food vouchers (mandatory by EU law), nothing. Only at 11pm the ladies from ryanair appeared to prepare the boarding. Terrible service from Ryanair (or lack of them).
## 612 Manchester to Palma. Never been with an airline quite like this. Full of scams and will find any way to try and get additional money. Read all your itinerary and small print and don't listen to what you are told over the phone. After being told we could have hand luggage of 10kg we have been told in our boarding passes if we bring this or a bag that is over 40cm by 25cm we will be charged \302\243116. We also booked and paid for the holiday together but we are sat no where near each other. Unfortunately, I got an all inclusive package deal and we are already having problems with Ryanair.
## 613 Budapest to Prague with Ryanair. Worst airline I've ever flown. Makes it incredibly hard to check-in online and then penalized me hundreds of dollars to checkin at the airport. I've never seen anything like it. A really bad joke! I paid more to check-in than I did for the tickets. Zero customer service interest in dealing with this.
## 614 Manchester to Limoges. The complaint relates to checking in via the app. Tickets bought months ago but checked in today, 13th July 2019. Selected check-in in for outbound and inbound, entered all passports details. After outbound checked in a screen pops up saying you've no luggage booked. Therefore booked 2 bags, 1 for outbound, 1 for inbound. Completed the check-in process and the 2 bags are showing on the inbound / return journey? So Ryanair says no bags, we buy, and they put them on the return journey? Seriously that's a joke. Rang customer services and on phone on hold for 30 mins before able to speak to anyone. Long story short they deny this has happened and it's our error. They are unable to change 1 of the return bags to even it out, you know, so we can take clothes with us rather than stock up on holiday tat to bring back. How is CS unable to amend this? Why did the baggage screen not pop up before any check-in, not just the return one? Biggest way of conning people, stealing their money and they clearly don't give a flying muck.
## 615 Dublin to Frankfurt. I cannot believe the struggle me and my partner had whilst flying with Ryanair. I\342\200\231ve never had such a hard time flying, we nearly missed our flight because of the print out before flying policy. We had no access to a printer nor does many people thus making us near miss our flight. I was so disappointed with the staff and the lack of help they gave us. I have severe anxiety and this caused me to have a panic attack. Will never fly with this airline ever again.
## 616 This was the first time I have to fly with Ryanair and it will be my last. In June 2019 I booked a seven break flying from Bournemouth to Gran Canaria with Ryanair. Ryanair is the worst airline I have ever had the misfortune to travel with. Since I lost my wife this was the first time I ever travel alone, at the airport I was charged over \302\243100 for not check in online and oversize hand luggage then put it in the hole. I am a cancer patient so I had to empty all my medications, some into my pocket and carry some in my hands this was so embarrassing. then it was a long waiting at the gate because was late there was no apology, the cabin crew was all hard face and not very helpful they don`t seem to be happy in the job, seating was cramped, not comfortable the taking off was horrible, the landing was so hard the plane bounce up and down on the tarmac if make feel sick. I booked a fast track transfer and I was put on a coach that take over one and a half hours. I will never fly with Ryanair again or recommend them to anyone they are cheap but nasty.
## 617 Edinburgh to Luxembourg. I have had problems with Ryanair multiple times before. First problem appeared when some of our wedding guests were not able to show at the ceremony as Ryanair suddenly changed the flight dates. Another time we paid for priority boarding. We crossed the gate amongst the priority passengers. Instead of letting priority passengers enter the plane first and then admit other passengers on the board they let everyone pass at the same time. Then today on our flight to Luxembourg we arrived 2 hours before the flight, scanned our passes through security and waited 100 meters from the gate. 30 minutes before the flight we approached the gate. There were no passengers left, only the staff. Then we were told we were two minutes late at the gate and they already deleted us from the passenger list so we won't be able to get on that flight. Staff were very rude and not helpful at all. Never in my life have I experienced such terrible customer service. Usually the boarding doesn't finish up until just before departure! There was no final call announced for the flight, our names were not called! The staff were awful and the only thing they could say was "you won't get on that plane". They expect customers to pay all these extras for seating together, cabin luggage, I won't be surprised if they start charging for using a toilet during the flight! But when it comes to be understanding to customers who pay money for the service, they just do not care. I would understand if we had been late and the plane had been starting the engines and preparing for departure, but we could actually see people still entering the plane from the window! So we did not go to our holiday and lost a lot of money. Thank you Ryanair for ruining our holiday! I will never use Ryanair again!
## 618 Rome to Stansted. Terrible. Flight scheduled at 1115 am but ended up delayed to 5.15 pm! No explanation, no staff to assist, nothing whatsoever. We bought the more expensive earlier tickets so that we can spend our time in London, with all the attraction tickets bought. Now all will be lapsed because by the time we arrive at London, it will be 7 pm. Worse still, when we went to the ticket counter at Ciampino airport, the staff said they were not Ryan ir employees when they were clearly stationing a Ryan air counter. Will never book Ryanair.
## 619 Naples to Barcelona. I would not choose or recommend Ryanair ever again. I made it to the airport with my bag that I have carried on a flight before. However, they insisted I check my luggage so I did. I arrived in hopes of getting my bag and going on with my vacation but there was nothing there. I took all of the proper steps to file a claim and create a report but I am now at 5 days into my trip with 4 days left with no bag. I had to buy more clothes, I am down a laptop, and I do not have my medicine all because I was positive I'd be able to carry my bag on as I did before! I can not get in touch with anyone, the company keeps sending me automated emails, and I have yet to be compensated for any spendings as promised by the claims clerk in Barcelona. . This was my first and last time using Ryanair. I know it can happen anywhere, but the fact that it has been 5 days is crazy to me! If you choose to fly Ryanair try to fly with carry on. I am not leaving this review to keep people from using the air line or to scare you. I just want people to be aware and prepared just in case the same happen to you.
## 620 Barcelona to Naples. We were one of the last ones to board the plane, and the boarding people simply did not let us on the plane. We were told that we were late, and got the doors closed on us. So to this airline "last" means being one of the last ones in the line to board the plane. This was absolutely ridiculous. All of us had to buy another tickets for triple the price, wait in airport the whole day for it, lost the car we rented at Naples (our destination) as well as the money we paid for it, we also lost the money we paid for the hotel in Naples. This is an absolutely frustrating experience. Avoid flying with this airline at all cost if you don't want your vacation/traveling to be ruined and cost you lots of money! Just an absolute horrible experience.
## 621 Santorini to Athens. Ryanair is the worst airline I\342\200\231ve ever flown with. They may have \342\200\234cheap\342\200\235 flights online, but they tack on so many different expenses while at the airport. Their employees are rude and try to suck you dry of your money. There is a lack of communication and just overall disrespect for people. I would never fly this airline again.
## 622 Madrid to Manchester. Can't fault the flight. on time, cheap price, nice crew who were efficient. Certainly would use again.
## 623 Berlin to Budapest. I understand that this is a low cost airline but when staff try to gouge you at every opportunity it leaves you with a terrible taste in your mouth. They made me pay 20 euros per a tiny carry on briefcase that can easily fit underneath the seat. I travel for business every week and use a carry on on every other airline that I've flown with. I've never had an issue and I always place it underneath the seat. However, according to Rynair it is too big and I had to pay for it after already paying 80 euros for 3 other pieces of luggage that again on other airlines are carry on cabin luggage (the ones that are standard in North America). I will never fly this airline again. I don't care that they are cheaper, that does not give them the right to nickel and dime you at every step. No water was served on the flight and everything had to be paid for. Do not fly with them unless you are desperate.
## 624 The issue I have with Ryanair, everything else accepted that its a low cost airline and I was not expecting a lot of services doled out to me. However, when you pay for priority boarding, why do you have a single member for check-in at the airport and it makes you look silly and fee silly, that you are in the same line as the non-priority guests. Yes, there is a separate line for the gate access at the airport, but its not like a very big plane anyway. The food and everything else needs to be paid for, there is no inflight entertainment, and maybe like the US, they should make it paid for people wanting to. Otherwise I feel that for a flight to Dublin from LGW, even with paying for baggage and priority, it was value for money.
## 625 Amsterdam to Dublin. Checking into our flight in Amsterdam was by far the worst experience I\342\200\231ve had with an airline. With only two desks open and well over 150 people waiting in line, we waited for an hour before we got to the front of the line and were told, as Canadians without an EU passport, we had to go somewhere else to get out boarding passes and then return back into line to check our baggage. What a joke. Where was an employee telling people this for the last hour!? So unprofessional and not the way to run an airline check in. I will not be flying with this airline again and will not recommend it to anyone. Won\342\200\231t be surprised if we miss our flight at this rate.
## 626 Pisa to Dublin. With new baggage policy there was no option to book 10k bag on board when booking flight so required to check in bag at airport. The check in desks are totally undermanned with only one person checking in bags. Already 15 mins in queue and barely moved. This takes me back a decade in travel process. Ryanair may be cheaper for most routes but at a significant stress price.
## 627 My wife and I were due to fly from Porto to Stansted with Ryanair. We had already flown to Porto with them and there were no problems and we arrived in plenty of time for the Flight passing through immigration and going to the gate. When we tried to board the plane the Ryanair employee said we could not fly. We asked why and she said my wife needed her boarding pass approved as she was not an EU Citizen. I tried to point out that my wife had a UK permanent residency card, but she refused to look and told us to "stand over there or I will call the police". As the plane was close to leaving, I approached her again and got the same threat. Finally after the plane left she and her colleague took us down a ramp opened a door and told us to go through. She slammed the door behind us and laughed as she left with her colleague. We were back in arrivals. As a result we had to stay overnight in Porto and book flights back to London City the next day, then train and bus back to Stansted. All in all an awful experience. I have complained to Ryan Air since September. First they acknowledged the claim and gave me a pass code to monitor it on their website. The latter was not recognized so I emailed them. No response for 7 months to numerous emails. I finally wrote to the MD in Ireland and received an email asking for copies of our travel documents, which I sent the same day. 7 days later I emailed again asking them to acknowledge receipt ... no answer. After another 7 days they emailed me to say I had not replied to their email. I replied and forwarded the original emails again one again asking for a reply. To date nothing. All I can say is that Ryanair should be ashamed of their employees action and their level of customer support which is 0.
## 628 Kiev to Stansted. I used to fly this airline many times before and took this tolerant as I understand that this is a budget airline, but this would be the last time me and my friend are flying with this airline ever. The cost of the ticket is small when you buy it many weeks before, if you buy few days before it increases by almost every minute but okay, can take that, but then the online check in closes 3-4 hours before your departure and if you didn\342\200\231t check in and printed off your boarding pass, you gotta pay 55\342\202\254 at the airport for you to check in on the flight that might have costed you 10\342\202\254 or 200\342\202\254 on the same flight same seat just if gotten later and this is without the luggage. The luggage costs another 30-50\342\202\254. And also, if your on-board bag is bigger than supposed to be by few sm, you pay another 25\342\202\254. The airplane is extremely uncomfortable, the seats are uncomfortable. The flights are late on boarding and the customer service and the service on board are very low as well. So it might turn up that you actually pay more, than flying on normal airline. Me and my many friends decided never to fly with Ryanair again, rather pay more for a comfort normal airline and never worry that you might be charged on top or you might be late without them saying sorry. So before hunting for a lower cost, really think about it
## 629 Our flight was delayed by 60 minutes going from Palma to London Stansted. Not awful but after doing some research online, apparently Ryanair has been late arriving at Palma from London Stansted roughly every other day in June 2019. Recommend building in some extra travel time going back to the UK if you opt to use this airline.
## 630 Another good experience with Ryanair. Great price on the ticket. Flight was pretty much on time. Staff were nice. Boarding was fairly smooth but involved a bit of queuing up, this is by no means unique to Ryanair though. Plane was new, and seats were the thin type which means you have a passable amount of legroom. Had food on board - selection was actually good, price was reasonable and quality was ok. I just don't understand why so many people still criticise this airline - you're paying budget prices - what do you expect? Just don't be an idiot and turn up with excess baggage or having not checked in. Ryanair must send about 10 reminders about this, but some people seem to still miss it. Or, they figure they will just do it anyway, and then stamp their feet to get an exception - don't bother - you're just wasting your time and money, and you will stress yourself out. My two detractors are 'priority' is not really priority these days, because half the plane has it, it should really be seen as a cabin suitcase surcharge, and I think Ryanair may as well just rename it as that. Also, if you have young kids, probably not the best choice because you will probably have to queue up a bit and use a bus to get from the gate to the plane.
## 631 Faro to Eindhoven. My first time to travel with Ryanair and I was very satisfied. I paid for no extras. Seats are fine but don't recline. The nicest part of the trip was how polite and friendly the flight attendants were. We arrived punctually.
## 632 Athens to Catania return with friends (group of 4). Booked a cheap fare (80\342\202\254) and traveled only with a backpack. Used the app and did not pay for any extras. Got seats 3C (first row aisle) and 33F (last row window). Both flights very full. We were given seats far apart but we did not mind. Outbound flight left on time, return flight used an air-bridge at departure airport - it's the 1st time I encountered this with this airline. This delayed the boarding process a lot, as people were only entering from the front and trying to swap seats in order to sit with their friends/partners/families and they were doing that with their hand luggage, causing a delay of departure of almost 50' (landing 20' late). Majority of the passengers had bought priority, so it's not really priority. Beyond this, it was standard Ryanair service.
## 633 Bergerac to Stansted. I have been flying with Ryanair for the last 10 years every 3 weeks from Bergerac to Stansted to and from for work. And have only once had my flight cancelled but that was due to French strikes. And only had maybe 2 or 3 delays. Not bad going for 10 years of traveling. Thank you it was a pleasure flying with you.
## 634 Barcelona to Prague. Ryanair charges 55 euros cash at the desk to give you your boarding pass if you do not check-in online! Our flight should depart at 1 pm but they departed at 2 pm!
## 635 Athens to Santorini. Worst experience ever. Was not able to check in prior to flying. Worst for luggage. Was charged extra to check in at the airport. They are money grabber. Fool you by cheap flight then you are charged extra . Couldn\342\200\231t even download their app to check in. Don\342\200\231t fly with Ryanair.
## 636 Murcia to Luton. Had a minor disagreement with ground staff as I was boarding the plain. It was regarding my hand luggage. I was not threatening violence or aggressive in any way. Staff were rude also giggling amongst themselves. I had a disabled son I had left at home with Carers so it was even more important I got on this flight. I explained all this & even resulted in showing the staff pictures off my son. To my dismay they shut the doors and refused to allow me to board. I was left in utter dismay whilst the young immature worker continued to giggle like a 10 year old! Worst airline ever.
## 637 Dublin to Barcelona return. I didn't opt for allocated seating or priority and saved 40 euro. I waited until this last moment to check in and got a lovely extra leg room seat. I also brought my own food. Staff were nice and polite and everything went very smoothly on the outbound and return trip. There was not the same sales sales sales as there was on a previous flight to Malta and the staff dimmed the cabin lights so children could get some sleep. Overall not bad but there is no overall consistency in the product, it depends on the crew. This flight was good perhaps because of the other competition on the route by EI and Vueling but when I travelled to Malta (detailed previously- it was horrendous money grabbing experience on board where the blue lights on a night flight were only turned of as the plane hit the tarmac in Valetta and the staff sold drink to people who were way past their safety limit). I think Ryanair really need to work on culture and values and have a consistent approach to customer service.
## 638 Stansted to Rhodes. Got to the airport and they charged me 40 for two cases because apparently I hadn't paid which i had the paper work to but they wasn't interested. By the time our cases were sorted and we got to the gate it had closed and the realised that check in desk hadn't gave us our boarding passes but we hadn't realised that because we were running against the clock to catch the flight. I would not recommend this airline.
## 639 Gatwick to Dublin. The reception staff member at Gatwick airport was extremely rude and unprofessional. Afterwards the gate display started very late, for a flight at 0940 it started displaying at 8.45 then 0855, 0900 finally 0920. The queues were so long and airline was understaffed at boarding. After boarding we were taken on a bus almost for 15 mins to the plane, at the time of writing this review tine is 1035 and no sign of take off. If possible avoid this airline.
## 640 Manchester to Barcelona. Flight cancelled due to fuelling issue, unorganised hell, staff didn\342\200\231t know what was going on, no information passed on, no alternate flight or accommodation offered. Did not make it on our holiday, and have been told are not entitled to compensation as it\342\200\231s \342\200\230out of their control\342\200\231. Well it certainly isn\342\200\231t the passengers responsibility to fuel the plane. Furious is a under statement, complete lack of compassion or care. And customer service staff very blunt, rude and unhelpful.
## 641 Lisbon to Berlin. Second Ryanair experience, and second good experience. Perhaps I've gotten lucky, but I've found the airline to be efficient and very cost effective. Boarding was a bit chaotic and there were two long queues which delayed the departure. As such we left a bit late, but made up time in flight so were basically on schedule. Crew was professional and there were no dramas. I believe the airline offers excellent value, just need to be mindful of all of their rules and you'll be fine. At a third of the price of the major carriers, it's hard to find fault.
## 642 Copenhagen to Stansted. When arriving at the airport we were told that we were not allowed to queue in front of the area where the baggage was dropped off. The explanation we were given by staff was that if we formed a queue this could be seen by the cameras in the airport. The airline, we were told, did not want it to appear as if there was a queue as this would reflect badly on them. Instead we were asked to wait in an area that was not visible to the airport cameras. Usually I have no issues with low cost airlines: You get what you pay for. However, while the rest of our journey was fine and all staff were perfectly polite both on ground and in the air, I am unlikely to want to fly with a company that has policies to cover up information.
## 643 Stansted to Bucharest. First they charged us to check in $136. Then they put me to pay $50 for the bag I had for my infant, even if I was allowed with one, they said no and i had to pay and they took it away so I did not have diapers to change my baby in the plane. Any company when you have an infant they board you first... not with them... we were the last. When we finally got in the flight attendant was telling me I am not allowed to sit on that seat with an infant... remember that they charged me to check in, finally they found me a place to seat and the plane is delayed so we don\342\200\231t have AC for almost 2 hours. Finally we leave and the AC still doesn\342\200\231t work.
## 644 Porto to Barcelona. Do not fly with Ryanair. They find a way to charge you extra for no reason. I payed an extra 12\342\202\254 for a small checked in bag just to make sure they wouldn't refuse my small backpack as a carry-on. That was fine. But then what a surprise when i get at the airport and they tell me I had to check in online to have my boarding pass because for some reason they don't do it. I knew there were extra charges with them but I wasn't expecting to pay 55 Euros for a piece of paper that would have cost nothing to print. The clerk also told me to run because I was tight in time and that they would not wait for me. I ran for my life only to get at the gate and wait for 30 minutes because they have the worst gate management I've ever encountered in all my travels.
## 645 Milan Bergamo to Tel Aviv. Bad airline, bad customer service. My ticket included 10kg check in bag. When I arrived to the check in counter the representative did not mentioned anything about the need to check in my carry on bag even though she had seen it when I approached her. When I arrived to the boarding the representatives asked me to pay extra 20\342\202\254 for my carry on bag even though I had showed them that I bought it in advance. The representatives asked me to get out of the line until I will pay the 20\342\202\254 fee. I ended up paying double - when I purchased the ticket and on boarding 40% of the price of the ticket.
## 646 Vienna to Stansted. I thought that the first time I had the following experience with Ryanair it was some sort of anomaly- oh was I wrong. Ryanair would not send me electronic boarding passes for me and my family. We had to arrive at check in and get those printed. We waited in the luggage drop off/check in line and waited for 20 min. We were given a slip of paper and sent to another line. This line took an hour. Several people in line missed their flights. When we got to our turn in this line, Ryanair for the 2nd time (once previously in Barcelona) accused me of not checking in and tried to charge 50 Euro fees per person to check in. Luckily, both times I had the app downloaded with proof that everyone had been checked in. The worker at the desk in Vienna made some phone calls and they \342\200\234waived the fee\342\200\235. We made it through security and once to the gate things were hectic again. The Ryanair attendants were treating a couple from India quite terribly, accusing the woman of having a fake visa. This went on well into our boarding time before someone took the couple away. The young woman was visibly upset at the accusations and other passengers were upset with the way she was treated - regardless of her visa status. When the flight landed in London and people got off the plane, there wasn\342\200\231t a clear direction to go. I have video of a plane full of people walking around the plane wondering where to enter the airport. Overall, terrible experience. If you have a flight with this airline or it\342\200\231s partners, I recommend arriving 3 or more hours early to the airport no matter the time of departure.
## 647 London Gatwick to Dublin with Ryanair. I am now 25 minutes standing at bag drop off point and no staff present. I tried to book priority while checking in so I could take my 10kg bag on board but this was not available. Today\342\200\231s journey feels like I have stepped back 10yrs in air travel. I am a regular user 8 to 20 time per year but it\342\200\231s time to use another airline where possible irrespective of price. Such disrespect for customers is hard to believe in 2019.
## 648 Ryanair are the worst carrier I\342\200\231ve flown. Recently I flew from Manchester to Marrakesh and Lisbon to Manchester so my information is up to date. It\342\200\231s as if Ryanair sets out to test is customers at every step from booking to check in to the moment you get off the plane and are finally free of them. Let\342\200\231s start with priority boarding. Don\342\200\231t bother as you will end up queuing in a stairwell with everyone else once you get through the gate. At Manchester we waited for half an hour in a stair way. Some of the older customers were really struggling. We should have been kept at the gate until they were actually ready for us to board. The same happened in Lisbon but this time we were left waiting by the runway with the fumes of the planes blasting over us. Ok then the seats.... the single worst seats I\342\200\231ve ever sat in on a plane. Rock hard, plastic covered monstrosities. They won\342\200\231t even tilt back. Awful. The seats actually cause pain. By the time you get on the plane the customers have lost all sense of composure. Their nerves are shot and they are boiling over with anger at the service that they have received. This causes an underlying feeling that someone is going to lose it and kick off. The cabin staff aren\342\200\231t interested and who can blame them. The must put up with this kind of thing every day. They aren\342\200\231t cheap flights either so it\342\200\231s no excuse. They need to improve greatly or I see them losing vast numbers of customers.
## 649 Brussels to Barcelona. Always a horrible experience flying with Ryanair. Employees trying to get money off you wherever they can, horrible waiting times and boarding procedures just to name a few. Just horrible as always flying with them.
## 650 Cluj Napoca to Southend. I don't want to complain too much, because we all know this is a low-budget airline. You won't expect to have extra services nor a lot of space when you fly here, but you expect the personnel to be nice. I bought priority tickets, both for me and my brother and an extra hand baggage was added. The issue is that after I put my big bag in the storage place above our head and sat down, the stewardess took it out so she can put another clients bag there who was sitting several lines in front of us. She asked me to put my luggage next to my hand luggage under my feet, but it was uncomfortable. She kept apologizing, but realized that the luggage she was trying to put up there instead of mine was too big. So she sent that down. I asked if I can have my luggage put back there, she said yes, but didn't move a finger to do it so, she even left. I paid for that place and I considered it very rude that she took out my baggage so she can put there someone else's.
## 651 Malaga to Berlin. Worst customer service I have ever experienced. I had to take take a Ryanair flight for business as they were the only company flying out of Madrid in the morning and could not check-in online because neither the app nor the website would work. I tried 5-6 times, both the previous evening and the morning of departure, but the seats I chose kept disappearing and then reappearing and I got the message \342\200\234Error 500\342\200\235. On the day of departure, I kindly asked the staff to check me in at the airport, but they said they had to charge me 55 euros because I didn\342\200\231t comply with the (stupid) terms and conditions. I explained that I travel every single week for business and that I know the rules but the site wasn\342\200\231t working - not on mobile and not on desktop or app. They still charged me and accused me of lying. I wrote a complain and the customer service there said that it was my fault for not complying to the terms, even though they made it impossible to. Long story short: Ryanair has awful, uncomfortable planes, but I could get over it if their customer service wasn\342\200\231t so rude and their policies so unreasonable. They make money out of creating bugs on their website and charge you for their own mistakes. I am shocked!
## 652 Luton to Girona. First Ryanair experience, went into this expecting the worst, ended up being a good experience. First of all their app is as good as any in the industry, which helps. The additional services they upsell (too frequently) are sensible and clear, and can be decent value. The need to physically print a paper boarding pass for non EU or UK passengers is the only real headache and lacks sensibility. You can check in on the app, but then need to use a desktop computer and printer to get the boarding pass, which is absurd. With all that done, the flight was on time, plane was ok, crews good and in the end this was excellent value. Honestly, legacy carriers like BA for short haul don't really provide more than Ryanair. You have to pay for a seat allocation, pay for food, no in seat power, no IFE and Ryanair is significantly cheaper most of the time. The overall experience exceeded expectations. It is no frills, but everything worked.
## 653 Edinburgh to Malaga. Absolutely disgusted. The staff were rude, misinformed me and charged me an extra \302\24320 for my bag even though I asked Ryanair staff at the check in desk if I needed to check it in downstairs and they said no. Of course when I got up to the gate they told me i should have, it was too late and I altogether paid \302\24332 to take a small wheely bag one way.
## 654 Brussels to Barcelona return. Outbound flight delayed with one hour due to ATC strikes in France so not the fault of Ryanair. Inbound flight on time departure and arrival. Cabin crew on both flights friendly. Captain (Dutch) on the return seemed to like his job which is always a bonus. New aircraft on both flights with the Boeing Sky Interior and new seats which was nice and a bit better for my back. Priority boarding is a totally different concept anymore now and they should rename it as yes you are still the first to board the plane...but probably with about 100 other passengers as it seems that most travellers take the priority boarding option. I don't understand why many people complain about this airline, if you read the rules well and follow them there should be no problem especially when you got a good price it's a very good price/quality product! I would fly them without hesitation when price and hours are acceptable.
## 655 Milan to Madrid with Ryanair. I don't want to minimize the negative reviews on here from other passengers but everything with my flight went fine. I read through all of their rules and looked at some online resources about how to make sure I didn't get surprised with any fees at the airport. I reserved a seat in the emergency exit row for extra legroom and paid for my bag in advance. I got to the airport two and a half hours early. The flight left on time and everything went just fine. I was actually scared to fly this airline but now that it worked for me once I'll probably fly them again in the future. Especially since the price was less than half of what a full fare carrier would have charged me for the same route.
## 656 Stansted to Rabat. Not oriented customer satisfaction. Frequently delayed. Last delay was around 4 hours (09/05 from Rabat to London). You pay extra fees to have a minimum of premium service seat in row 01 and you have to put you cabin bags and luggage around seats row 20 because flight attendants are discussing instead of organizing the boarding (some passengers were with 5 bags and seated in rank 4 and occupying all the overhead lockers of row 1/2. Plane wasn\342\200\231t clean. Announcement inaudible etc. Just a very bad experience.
## 657 Luton to Athens. Heartless people, no customer focus, poor customer service not understanding what people want. I will never fly with Ryanair and Luton ever again. They look cheap and by the time you book your ticket they rip you off they charge you even the paper to print your boarding pass so you ending up paying a ticket more than British Airways. Trust me do your math before you book very manipulative.
## 658 Faro to Stansted. I cannot understand why Ryanair are not rated higher. My flights were cheap. They were on time. Planes were clean. Cabin crew polite and friendly. Food and drink expensive but cheaper that a full fare airline where it\342\200\231s provided free. Flights were smooth. Ground handling perfect. Don\342\200\231t have any issue with flying this airline - they do the job without fuss and at a good price.
## 659 Stansted to Lanzarote. Their random seating option that ensures that 2 people never sit together unless they pay and choose for their seat has to be one of the most selfish and not customer friendly actions of all. When other airlines are focused on better customer service, Ryanair constantly strives to put their money interest first and the people they are serving last. Avoid like the plague, it\342\200\231s worth paying a bit more for a safer and more enjoyable flight.
## 660 Travelled from Rome to Eindhoven. It was a comfortable flight. Boarding was a little slow due to tha late arrival of aircraft. Check in was smooth. A little walk in Eindhoven due to unusual path from plane to terminal.
## 661 Venice to London Stansted. Worst experience ever. I have been flying frequently for 27 years for work and leisure and I never received such a combination of bad treatment by airline ground staff and disorganized assistance. 2.5 hour delay on the outbound flight and left down on the return flight after checking in luggage. Big trouble at automatic luggage drop in after check-in online, without proper assistance. Delays made us (family of 4) late at the gate and the gate closed just a few seconds before our arrival. No flexibility to let us in the plane. Luggage drop off and one day late return home with big work troubles. Never again on Ryanair. Do not fly with them. They are the worst airline in the world!
## 662 Berlin to Athens. It\342\200\231s the worst experience I have ever had. They opened a few counter for luggage dropping. It takes an hour! In the middle of our line, I went to the front desk ask to drop our luggage. The agent asked us to get back in line and wait. They speak terrible English. When we get to the front desk, they told me luggage drop in was closed. They have announced it. We never understood what they were announcing. They just told us to book next flight. I will not book their flight again. It\342\200\231s a long line, long wait, and they don\342\200\231t allow you sit together if you don\342\200\231t pay more. Worst service. Have to pay more for luggage.
## 663 Belfast to Manchester. Terrible airline, you now have to pay for cabin luggage and to sit beside your travel partner/s. I will never travel with them again. Avoid at all costs!!
## 664 Edinburgh to Barcelona. Worst airline I have ever been. Rude and unfriendly staff, they made me pay \302\24320 for my cabin luggage. Even if they made me pay for my hand luggage, they didn't allow me to take into the flight, they took away to go in the hold. They make the tickets so cheap and affordable in their website hence once you are there, they charge you for seat, for cabin baggage! Never again with Ryanair. I had stressful experience.
## 665 Stansted to Bucharest. I choose my dates in June 2019 and my seats and when I wanted to pay a window popped up and said that a problem has occurred and I have to choose everything once again. When I did that, which took me few seconds, the prices changed, even priority and seats prices.
## 666 Leeds Bradford to Malaga. Departure was a nightmare, no one knew what was going on. The flight was delayed over 3 hours. We were sent a food and drinks voucher which we couldn\342\200\231t use as it only applied to certain shops (great if you wanted ice cream for tea) and as we had gone past security it was pretty useless. For every delay we didn\342\200\231t get the messages in time so we were stuck outside the gate. Then when we finally got on the plane, we were stuck on it for over an hour. Because of this mess we hadn\342\200\231t managed to have a proper meal, no free food was offered. I got home at 4am and I am now severely jet lagged as overall we had travelled (including wait times) for nearly 10 hours. If there were delays on Wednesday why were we not told when the delays started more warning could\342\200\231ve been given. To top it all off, they also lost my luggage. Never flying with them again.
## 667 Malta to Stansted. My friend and i flew Ryanair on the 6th May carrying a cabin bag. At the gate we were asked to pay \302\24320 for our bag . According to the airline staff "we did not check the bags downstairs for free. We paid it. I then asked her if we needed to pay for priority on our way back in order to take our bags and she said no. We can check it in free. On our way back on the 9th of may, we went to check our bags as we were told. But were asked to pay \342\202\25420 each. The lady said this is Malta not London i dont know what you were told there. We asked to pay for priority as we were misinformed but were told priority was finished. This is really disheartening as when i checked in online it stated i can check in a cabin bag for free. I regret flying them.
## 668 Gatwick to Alicante. This airline has got to be the worst I have ever flown with, they give you a cheap price for the ticket then get you at the airport for as much money as they can get out of you. For example cabin luggage we had to pay \302\24340.00 for a cabin case that is accepted on every airline on the planet and the only one they will accept is no bigger than your wallet (funny that!) and soon they will probably start charging for that soon. Then if you don\342\200\231t pay extra again for your seat they make sure one of you is at the front of the aeroplane and the other is at the back. I will never fly with Ryanair again because if you fly with a normal airline it works out cheaper in the end as I have checked this so save all the grief and pay the few pounds extra when you go to a normal airline and you will save money and stress.
## 669 Berlin to Budapest. Fast boarding, fast take-off, efficient though no-fuss service all along. Departure and arrival both on time. Only complaint is that seats didn't recline.
## 670 Flying back to England from Corfu, we hadn't been given our return flight check in details previously as we do with other airlines so just assumed they would be given to us at Corfu airport. Wrong!They said we should have printed them off before ourselves. Never come across this before with other airlines and we've flown a lot over the years. Now it was 2 hours to the flight that facility was closed and we'd have to pay 55 euros each extra. The original flight cost was only \302\24371 each return so that was too much. A rip off. Fair enough to charge us a bit but not that much. Then we were given our seat numbers and surprise surprise we weren't seated together even though the plane was half empty. We then proceeded on the plane to all swap seats so people were sat next to each other which because of all the empty seats was no problem. I know we could have paid to sit next to each other, but again they charge too much. \302\2432 or \302\2433 and I like many people would pay, but not \302\2439 each,each way. Greedy. Altogether its just not a nice experience. Contrast that to Jet2, what a difference. Will try my hardest to never book a holiday with Ryanair flights attached to it again.
## 671 East Midlands to Barcelona. Having paid for an extra 10kg of luggage on the booking, the check-in staff made me pay an extra 20\302\243 because it hadn't been checked in. 20\302\243 extra for a ground handling agent to bash your luggage into the cargo.
## 672 London to Lisbon. Worst airline I\342\200\231ve ever dealt with in my life. First you have to check in online and print your boarding pass, they do not accept e-copies! Otherwise, you have to pay 55\302\243. Next, the flight was late about one hour and forty minutes without any explanation of or any apologize. Flight was scheduled at 9h50 but did not fly before 11h30. For a short trip such lost time means a lot. Staff on boarding was so rude and does not treat passengers with respect. Seats were too small and no space for legs. They do not provide anything - even water. More than 4 hours (including waiting and flight times) of torture. I felt as if I were detained. Do not recommend at all.
## 673 Bucharest to Madrid. I had the most awful experience with Ryanair and I feel that I was robbed by them. I received a text message Sunday night, after 7PM, saying that if I don\342\200\231t check in online I could pay up to \342\202\254110 of fines for my tickets (keep in mind that the ticket was \342\202\254186). My flight was the next day at 3:30PM. I tried checking in online with the app and website but it kept saying that my reservation number was incorrect. I tried calling that night but their customer service was not open, so I waited until the next morning to call. I called 3 different times that day and waited on hold for costumer service for a total of 65 min and never was able to connect to anyone. Once I arrived at airport, in Bucharest, I spoke to Ryanair sales rep and her manager was treated absolutely terribly. I paid the fine, of course, but the way they treated me and my girlfriend was unacceptable \342\200\224 their rudeness brought my girlfriend to tears. I get hopeless. I knew that I had to check in online, I tried my very best to do it, once I couldn\342\200\231t I tried very hard to get help from the company but was unsuccessful \342\200\224 the result was \342\202\254110 fine on \342\202\254180 ticket.
## 674 Berlin to Athens. I rarely take the time to write reviews, but I feel it necessary to warn people about Ryanair. I tried to check in online before my flight, but neither their app or their website were working. I figured, \342\200\234No worries. I\342\200\231ll just check in at the airport. I don\342\200\231t even have any bags to check\342\200\235. But when I got to the ticket counter I was informed that because I did not check in online I would be charged a 55 Euro \342\200\234check in fee\342\200\235. I was at the ticket counter an hour and a half before my flight, but they told me you could only check in in person 2 hours before a flight to avoid the 55 Euro fee? I\342\200\231ve never heard of any other airline doing something like this. I asked if I had any other options since I had tried to check in via their app and website which had not been working. I was rudely told \342\200\234Pay the fee now, or get out of line and don\342\200\231t fly with us.\342\200\235 To top it all off, the exchange rate to US dollars made my fee increase to $61.52. They also charged the two people I was traveling with, so in total we paid $184.56 for a \342\200\234check in fee\342\200\235. Ryanair must make a fortune doing this to people. Don\342\200\231t let them do this to you! Don\342\200\231t fly Ryanair!
## 675 My experience with Ryanair has been great. As I don\342\200\231t live in Europe I only fly with Ryanair once or twice a year and have been flying with them in the past 10 years. I have never had any problems with baggages or seats or delays but today (5/5/19) Ryanair really shines. The flight was right on time and arrived early. But I was silly enough and left one of my pieces of hand luggage on the plane and left the airport. In the bag I had all my cash, credit cards, driver license etc. I came back to the airport and reunited with my bag and nothing was missing. So a big thank you to the Ryanair staff and Brindisi Airport. I was very impressed. Happy flying everyone.
## 676 Dublin to Malta. I flew recently with Ryanair and normally have no complaints, play by the rules and you can get a good deal. I dont buy priority which is farcical, bring a hold all, People were bring rugsacks and putting them in the overhead bins, also dont opt for seat selection, they will rob you at 10 euro a seat to ensure you are sitting together, I opted for random allocation for me my 12 and 13 year old and look at the screen shot, a whole row free but we are dotted all around the front of the cabin. I saved myself 160 euro by not opting for priority and not selecting seats On the outbound flight, my clothes got destroyed with someone else's chewing gum that was left on a seat and I only discovered this when I was leaving airport, my jeans and coat had to be placed in the freezer and while I was able to get the gum off my jeans I couldn't retrieve my coat at all. Also there was a really drunk lady on the flight, allowed to get on the plane drunk and the staff kept serving her the whole flight. When the plane landed she was inebriated and the staff escorted her quite roughly and deposited her on the transfer bus, the lady was three sheets to the wind, they did not arrange any assistance for her and it was left to me and my husband to get her through security and try to get her to a taxi, she was staggering and shouting and could have been abusive. Why allow a drunk person on a flight? Why keep serving a drunk person who is over the limit and a risk to themselves and others? Does sales targets over-ride customer and flight safety? Where does their duty of care end? Ryanair need to update and tighten the policy on drunk customers and conduct expected from passengers.
## 677 Bristol to Tenerife with Ryanair. Deceivable pricing ending with a rip off. Bought the tickets to find out that I cannot check in earlier than 48 hours without buying their expensive seats. Same problem with the luggage, no priority availability (everyone in the plane has priority now, no place to leave your luggage) had to buy their expensive hand check in luggage. On return everything is even worse because all the prices paid on the way out have been increased. Also, no availability to buy the seats to stay next to your wife. I advise everyone to use another company as much as possible. You pay more in the beginning but you avoid this long set of different ways to rip you off.
## 678 Together with my wife and my two kids (3 and 10) we were going to Copenhagen for a weekend trip. We booked Ryanair from Stuttgart because the offered price was attractive. I\342\200\231m flying quite a lot for work and I am used to normal flight practices. However, what Ryanair is doing is just fraudulent and absolutely unacceptable. For the flight to CPH we checked in through the internet, printed our boarding passes at home and everything was ok. In Copenhagen we stayed in an apartment without access to a printer. Also, I didn\342\200\231t know checkin had to be done a minimum of 2 hours in advance through the internet, as this was not mentioned at all on the Print-outs of the e-tickets. Upon arrival at the checkin area, we were informed we had to pay 60 EUR per person because our checkin was not done on time (we arrived there 1h and 50 minutes before flight time), which meant an additional Eur 240 for the 4 of us. We were not the only ones concerned and just next to me was a handicapped couple, which also needed to pay. Such kind of business practices are just unbearable and fraudulent, because this information was not mentioned anywhere. Apart from Ryanair I totally do not understand how airport staff can accept such business behaviour, because at the end it\342\200\231s them who force the people to pay. These people are no Ryanair employees, in fact there is no Ryanair office, nor Ryanair employees in the whole of Scandinavia. Also in Stuttgart airport there are no Ryanair people present at all. I would feel ashamed pushing through such policies on the back of the customers and I do not understand how people can go to work every day under such circumstances, because obviously they have to deal with many unhappy and sometimes angry passengers, who just feel nailed by such business practices. Well, I learned from this experience that I will never fly Ryanair again, neither for work, nor for holidays. And for sure my two kids will never fly Ryanair again either. So they have lost two potential customers immediately and two future potential customers. I honestly hope more and more people will boycott this company so that it disappears from the market. The sooner, the better.
## 679 London Gatwick to Dublin with Ryanair. So like many we got hit with the not confirming our tickets. When we ordered or received confirmation about flight never did it mention anything regarding us needing to confirm. I have flown quite a bit and I have never had this happen to me. We apparently missed the check time by less the 5 min but they wouldn't accommodate or help out in any way. Service staff are not helpful or kind among other things. Don't ever waste your time with this company.
## 680 Krakow to Rome. The only thing that makes me happy is that I\342\200\231m not alone. They just stole 62 euros from because I didn\342\200\231t do the check in online. I never received the email with that information. Don\342\200\231t know who created this but like many other reviewers, bye bye Ryanair. You are the most dishonest airline in the universe! Never flying them again.
## 681 Alicante to Birmingham. After an absolute nightmare of a day finally in a car on the way back from Liverpool. Booked return flights from Alicante a while ago, I did this on the phone with a member of staff who went back over all information with me and had it correct. Today we get to the airport to get on our flight for hem to tell us that my 11 year old sister is our down as a 1 year old and doesn\342\200\231t have a seat, so to this we go over to Ryanair help desk to discuss it with them and from the minute we get there they are nothing but rude to us and insist it\342\200\231s our fault and they aren\342\200\231t going to do anything to help. They come out start talking to one another pointing at her and laughing, to then tell us that we are to leave her there alone and the rest of us to get on the flight. I asked them how that works considering their policy states any child under 16 not accompanied by an adult can not fly, they then tell us that is we aren\342\200\231t to stop and be quiet they will ban all 5 of us from flying! We finally found a flight with easyJet that wasn\342\200\231t til midnight and we have finally arrived home.
## 682 Stansted to Naples. They made me purchase Priority 2 cabin bags for the way back without telling me it was already sold out for the way out. This cannot even be refunded! I won't be flying with Ryanair anymore. Customer service charged me 13p a minute and they did not pick up for 15 minutes. Chat do not get answered before an hour.
## 683 Everything went well until a technical issue. The plane had pushed back, then started to taxiing but after about 30-40 meters it just stopped. We saw some cars around the aircraft and later on the crew announced a technical issue. It was about hydraulics. But the all the announcements were only in Italian, what is quite strange, especially on an international flight. I have never experienced that even on internal flights. Cabin crew should not be that lazy. Anyway, afterwards our 1 extra hour in the plane everything was good and we arrived back to Barcelona with a smooth flight.
## 684 April 2019. I was traveling all around Scotland 3 weeks before my Ryanair flight. I didn't have access to a printer so I couldn't print my boarding pass. I got to the airport 15 minutes late or 1 hour and 45 minutes before my flight, only to find that they were hitting me with a 55 pound penalty. As a senior citizen, I pleaded my case with the ticket agent and she said it was policy not to waive the fee. Now keep in mind the 55 pounds was more than double the price of my ticket. So I said I'm better off just re-booking my flight and not paying the 55 pound fee. They said, "no you can't do that the flight is booked." However, if I pay the 50 pounds in addition to what I already paid for the ticket, they can find a seat for me. That was just terrible. They may have robbed me the 55 pounds this time, but do you think I will ever fly that airline again? No way! Not only did they lose a customer, but they lost any future business. Whoever the marketing person is who came up with that policy should be fired. It discriminates against Americans because we don't see this type of fine or penalty for not checking exactly 2 hours before a flight. I flew a different airline on the way back. It's their loss. Join the boycott and save other travelers from being robbed.
## 685 Gdansk to Dublin. I am an Irish citizen currently stranded in Poland after losing my passport on holidays. I have my government ID and drivers license with me. At the airport, I was allowed to check in and get through border security. Ryanair staff at the gate for the flight refused me entry, offered me no refund, no help and didn't even allow my checked bag to go back to Ireland with my partner whom I was traveling with. Thanks to Ryanair, I had to miss my flight, travel 400kms with a heavy bag to Warsaw to the Irish embassy for travel documents to be made and book another flight home that will take 20 hours (9 hour stopover in Frankfurt). To say that I am disappointed in Ryanair service is an understatement. Never again
## 686 Flying to Santorini using this same airline, we had no issues. Coming home was a different experience. We paid extra for priority boarding both ways that gave us the option to have a small bag and personal item. The flight from Santorini to Athens was the problem. Because I was close to the front of the line, I watched about 20 passengers go through. They said our bags were too big. They are hard bags so they cannot expand. Mine fit in the bin but \342\200\234not with room\342\200\235 and my husband was close to fitting in the bin. Therefor we were each charged 50\342\202\254 (100\342\202\254 total) for the same bags we brought. They made us pay cash because our credit cards didn\342\200\231t work. I gave the woman 3 different cards, all of which had worked in the country. As I stood in line because my husband was forced to go to the ATM, I watched 1 bag goes through and one bag of same or similar size does not. The credit card machine never worked once. When my husband asked for a receipt, she said she could not give him one. We made her let us take pictures of everything as a result. She complied that much. When I showed her my boarding passes and my flight from 4 days earlier in the Ryanair app where I did not have these issues, she and the manager said \342\200\234other employees did not do their job.\342\200\235
## 687 Used Ryanair and regretted it from the off. Paid for my flight but still had to pay extra to sit next to my partner. Boarding passes needed to be printed. Bag cannot exceed 40cmx20cmx25cm - if you do you will need to pay \302\24350, a further \302\2438 pounds to select a seat. Inflight drink and chocolate bar \302\2437. If you are unable to print your boarding pass further costs are incurred. On board I was unable to sit normally and needed to raise my legs to fit. I never incorporated the extra costs and was under the impression that in 2019 paper boarding passes were a thing of the past. Don\342\200\231t be fooled by the cheap flights fly any of the other airlines and save yourself the aggravation. Delayed, hidden costs, avoid this airline.
## 688 My flight is from Santorini to Athens with family three. The staff who help passenger for checking in asked me do an extra pay EUR 68 per person ( the reason is that I have to check-in online in advance to avoid an extra charge at airport counter. I didn't get the reminders by email whatever (we booked separately). And passengers waited in long times without organized. Actually I have paid 20kg baggage fee when booking myself. Only I thought it was small not heavy then I can carry on. however the staff didn't reminder my baggage to be check in to avoid charge when checking in. when boarding began they asked that I need do an extra charge EUR 20 without receipt even I showed my file and explained it. My wife and daughter did same payment (shall pay EUR 10 per person if in counter. why SAY nothing at airport counter) the staff was very rude: \342\200\234Don\342\200\231t affect my work". This is the worst customer service what I have experienced so far. To charge its customers with additional fees by making some tricks. I will never fly Ryanair again.
## 689 London Luton to Athens. I booked mine and my girlfriends tickets at the same time, I also understood the risk that Ryanair may sit us apart however, when my girlfriend and I are sat 11 rows apart yet both of us have vacant seats next to us. Ryanair you are absolutely abysmal. You are forcing people to pay premiums to chose seats by intentionally sitting them apart. Your price difference is not that much lower that you can do that without people opting not to fly with you. From now on I shall not be using your service again. Your company is and always will be feral.
## 690 Gothenburg to London. Flights were on time. Staff were friendly. However, a new trick as usual has been introduced by Ryanair. They reduced the size of the cabin luggage to less than what\342\200\231s generally approved by other airlines! Also the left armrest has been broken and removed!
## 691 I booked my ticket several months ahead of my journey. Check-in online was easy and straight forward. The bag drop at Gatwick was well organised and I found the staff very friendly. As I was travelling before Easter the airport was very busy and yet the staff coped admirably. Before boarding, I noted with curiosity that each person checking-in had his / her photograph taken before boarding the flight. The flight left in a punctual manner and the staff worked hard. They made an announcement about a passenger with a nut allergy and took matters very seriously. The relatively short flight was well managed. My seat was not at all comfortable alas. The price I paid was not that much cheaper than the rivals on the route. One gripe was that I had paid for my cabin baggage and was asked by a crew member to place my bag under my seat "just for take off" - this turned out to be for the full length of the flight as the cabin crew member placed another passenger's bag into the overhead locker I had paid for.
## 692 Chania to Brussels Charleroi. The plane was a real garbage bin. Besides the fact that the flight left late (only 25 minutes), the plane was dirty. So if you have any dust allergies, avoid this company.
## 693 Ryanair is an absolute nightmare. We have used them twice on one trip and they have different standards at every airport and every counter. We made a booking and paid for an extra bag and everything was fine at Dublin but when we got to Malaga we had to pay extra for the bag as their system did not show that we paid for a bag. What was worse is the fact that they told us at check-in that the bag might be fine and we might not jave to pay for it but if their colleague at the boarding gate feels that it is too big we might br ble to pay at the gate pr maybe they won't let us go through at all. They weren't able to give us any assurance about what would happen at the boarding gate though. It's all based on the opinion of the specific person at the time. At Dublin we also had to pay a penalty of 110 euro because we didn't have boarding passes however when we got to Malaga them system worked completely different and we didn't need to have boarding passes. Will never fly with Ryanair again
## 694 Stansted to Rome. Terrible experience today! Not very pleased to say this is not my first with Ryanair. So we book our flight in March for today, 20th April 2019. We checked in yesterday and paid for the selected seats (after already having acquired Priority and 2 Cabin Bags) for 2 travellers. We leave Wales at night and get to the Stansted airport more than 3h prior to departure. The flight was scheduled at 6:25. At 5:10 still nothing is showing on the screens, so I go to the toilet and then we head straight to security. As soon as we get through security we look at the screen again (around 5:40) and the screen says "Final Call". Being in a a rush we run through the queues and head to gate 59. When we get there we get told that it's actually gate 91 (other side of the airport) and the lady says "there's only 2 minutes left, you won't make it". We ask whether she can make a call to advise we are on our way and this obviously was declined. So we start running again, with backpacks and hold luggages, to get to the right gate. This was very difficult to find and the airport staff we asked weren't that helpful. As expected we don't make it on time. We make our way to the "Returning Customers" gates and the airport lady did not even give advise on where to go or what to do, but simply cancelled our boarding passes and wished us a "lovely weekend". Lovely Easter weekend: stuck in an airport and our families waiting for us overseas! Ok, so we lose the money paid (around \302\24390) but we don't give up on spending our holidays with our relatives and friends! So we buy the next available flight from Stansted to Rome: 13:25 same day, with Ryanair. We pay the tickets, pay for the 10kg bags and do the check-in straight away. Having travelled with Ryanair for many years I knew that they are able to refund part of the original ticket price (\342\202\254100 or \302\24379), to use this money towards the cost of the new booking. This is apparently only applicable in certain circumstances, one of which is if you show up at the Ryanair desk not later than 1h after the original departure time. We get into the queue 15/20 min before the deadline and wait for about 30 min, to then be told by the two very unhelpful and disregarded agents (who had not a clue of what this process is), that we had to speak to the Money Exchange team. We leave the queue and wait to speak to this lady who, obviously, said "I have nothing to do with flights". Customer Service was terrible to say the least. What happened to the "Gate Open" and "Boarding" announcements on the screen? Is it a new trend to jump straight to the last call? To cause people stress, sickness, anxiety and everything else that comes with missing a flight, including massive extra financial expenses? Or is this just the way airlines operate today? Playing sick games to ensure people miss flights and spend extra money? Initially I mentioned that this was not my first misfortune with Ryanair: 3 years ago, summer time, my flight was delayed by 3 hours...my solicitors told me that my claim for refund/compensation has been placed on hold due to Ryanair having too many complaints and not dealing with them. We are currently about \302\243300 short due to failure to follow the process on the screen, failing to call our names for the last call (we had priority, there was plenty of time!), plus the hours lost hanging around waiting for another flight.
## 695 Munich to Palma de Mallorca. Laudamotion/Ryanair is probably one of the biggest scam airlines, I\342\200\231ve ever seen. When boarding the plane, they make customers pay 20\342\202\254 per carry-on bag (!) in cash (!), claiming that it was advertised in a confirmation email before (which it never was). We did not have enough cash on us and had to borrow money from some random people who were as baffled as we were by this scam move right before getting on the plane. Why don\342\200\231t you make the tickets 20\342\202\254 more expensive instead of fooling people into booking a ticket and then screwing them before they are about to board?
## 696 Manchester to Barcelona. Read the fine print very carefully. I did not, and I paid dearly. Luggage: included in the cost is what you can fit under the seat in front of you. It appears they purposefully spread your group out in the cabin. For example, I had an empty seat next to me on one of our flights, yet they didn't seat my young daughter and I together. She was in the rear of the plane and I was up front. Seating together costs extra. Technically they charge for choosing your seat, but again, my opinion is that it seems they make an effort to spread families around the plane unless you pay for the seating option. Their check-in process is a scam. You will receive an email 3 days before travel telling you to check in online or you will be charged 55 pounds. Okay, fair enough because they have warned you with a personal email, until you try to check in. After you enter all your passport and personal information for you and your party and go through all that hassle and get to the end of the check-in process, they'll tell you that you have to pay a fee to check in prior to 48 hours before departure. If you forget (like I did) and remember to do so once you arrive at the airport 1 hour and 59 minutes before your flight (like I did) and try to check in online, it will cost you 55 pounds per ticket. Here's the process: a) Wait in the queue at check in. The check in person informs you that you owe a fee. She fills out the a form (by hand) that you have to take to customer service. Wait in the queue at customer service. Pay your fee (which for us doubled the cost of our tickets). They fill out another form by hand (including credit card information by hand) and stamp it. You have to take this new form back to check in. Wait for a second time in the check in queue. You hand her this second form and she finally issues the boarding passes. Run to security because although you arrived 1 hour and 59 minutes early, most of that time has now been spent in 3 queues just to get a boarding pass. Again, read the fine print and understand what you are in fo. I recognize my own failings working with Ryanair, but it really seems like their process is designed to cause a certain number of passengers to fail at their game and when you fail, you pay so dearly.
## 697 We had booked two tickets and wanted to add hand luggage later. We couldn't change one of the tickets to priority with one hand luggage of 10 kg although this is promised on your website. We couldn't change just one of the tickets. So we had to pay 24 EUR for two pieces of 10kg luggage although we only had one. It wasn't communicated clearly, that we couldn't take the 10kg luggage on board. The term check-in luggage is misleading. When we asked at the gate what we should do with the additional luggage, we were told to join the Non-Priority line. Shortly before boarding, when it was too late to drop off the luggage, we were told that we were supposed to drop off the luggage and that we would have to pay another 20 EUR now to take the luggage. There is no information the website about how to complain about things like that.
## 698 Palma de Mallorca to Bristol. Shocking airline. They charge extra for picking your seats which is fair enough. We knew the flight had lots of spare seats so didn\342\200\231t pick our seats. But what they do is purposely sit all family\342\200\231s and couples away from each other to make you pay to choose your seats. Which then results in mayhem on the plane. Everyone wanting to move closer to there family causing the plane to be delayed. So many hidden charges. Very uncomfortable seats. Actually not that cheap once the hidden charges have been added. I will never use them again.
## 699 Southend to Milan. Great flight for \302\2439.99. Punctual, new aircraft, very smooth flight. With little money I can enjoy Europe and spend more money to visit museums and other tourist attractions!
## 700 Liverpool to Dublin. Ryanair have carefully designed significant financial pitfalls into their customer experience. 6 months ago, they removed the ability to take any practical-sized hand luggage on board without paying extra for it. As a 'sweetener', this additional cost granted you Priority Boarding. However, Priority is the new 'Normal', because 80% of travellers actually require a usable sized bag. The other rip off is the fee if you forget to check in within 2hrs of your flight. I have used Ryanair all my life, to regularly visit family in Ireland, and go to destinations in Europe, regularly noting their desperate and greedy attempts to extort more money from their customers/captive audience for things that were previously included within the ticket price. After this latest scam, I will never use them again.
## 701 Madrid to Manchester. Thank you very much for your flexibility, in my 10 kg checked suitcase I carried 2 extra kilos and the stewardess refused to allow it, then her boss came a very polite and courteous man and allowed me to carry my extra bottle. ES: Muchas gracias por tu flexibilidad,en mi maleta facturada de 10 kg llevaba 2 kilos extras y la azafata se nego a permitirlo, entonces vino su jefe un hombre muy cortes y educado y me permitio llevar mi botella extra por eso es el jefe, y no la azafata.
## 702 Manchester to Madrid. Possibly the worst airline I have ever flown with. Long queues, no organisation, hidden fees everywhere, rude staff who like to speak really loud and make a scene. Do not fly with this airline if you want a restful and stress free experience.
## 703 Myself and partner flew from Dublin to Stansted on a same day return. At take off the cabin was very warm / stuffy, had to ask cabin crew to turn it down found cabin staff unfriendly. On the return flight after going through security and about to board flight I showed my passport - my partner could not find his passport, he had a full driving licence and his pps card that he had to get before his passport was issued. He was not allowed to board the flight. He had to get a bus to Heathrow today and book his flight home with Aer lingus and there was no problem with him using his licence. Ryanair left customer stranded there answer was not their problem.
## 704 Barcelona to Porto. My husband and I purchased priority tickets and extra for 20kg check in luggage. When we arrived at the downstairs counter at Barcelona the agent looked at our tickets (not checking anything else) and told us we had to bring our luggage upstairs to the gate since we are priority. We even told her we were trying to check in our bags. After going through security, removing our liquids which we thought we would check we arrived at the gate and immediately asked an agent there. There two agents measured our luggage and told us to either go back downstairs (not an option since we would miss our flight) or remove items from our bag. I told them that I don't want to carry additional items in my purse since I am 21 weeks pregnant, in which I was told "It's not my problem." The agent was extremely rude and no one would check in our bags even though we had prepaid for 2 x 20kg bags. Completely incompetent and rude airline. Also extremely disorganized. After we initially boarded we sat on the runway for 40 minutes since we had missed our take off window due to the disorganized boarding process. I've flown airlines around the world from all different price points and have never accounted one so rude.
## 705 Prague to Edinburgh. This was my 5th flight with Ryanair in 7 days, and following the previous experiences with Ryanair this flight had high standards to meet. Immediately after getting off the bus from the terminal I noticed this aircraft was fitted with the old style of Ryanair cabin, this was to be expected but not to be looked forward too. When the safety demonstration was being performed it came across that the crew simply could not be bothered with their jobs and just wanted to be at home. After takeoff the crew continued to look fed up and put no effort into providing a decent onboard service for customers. When pushing the trolley through the aircraft they seemed to show the most attention to those customers who were sat on the left hand side of the plane. The announcements made by the crew were inaudible, partly due to an accent issue and partly due to the poor PA system fitted to this aircraft. The only time I saw the crew look happy was upon landing in Edinburgh when they were seeing us off the flight. Overall, I was very disappointed by this service, especially compared to my previous experiences with the company over the last week and hope that it was simply a one time scenario and not something more common place across the company.
## 706 From start to finish everything with the process has been shocking. \342\200\230Low fares made simple\342\200\231 understatement of the century. Our flight prices were not low and nothing was at all simple. \302\243209 + \302\24382 then a further \302\24340 totalling \302\243331. Few pointers, as I\342\200\231m not the only one this has happened to in the past week. When people are purchasing what they think is a cabin bag make it much more clear that it\342\200\231s not. In the circumstances people have purchased a check in bag and gotten through to security with these bags still in tow actually have staff at the airport to help. I paid for bags to be on hold and had to pay again for the bags to be taken from us upon boarding and to go on hold. This second charge should have never happened somebody should have taken these cases and put them in hold like I had paid for. The flight going and coming back we\342\200\231re both delayed, pure lack of organisation is the only explanation. Upon landing back in the UK being stuck on the plane as there\342\200\231s no buses to take passengers to the airport. Surely this is something that should be pre organised? Crew members were rude both going and coming, rude to each other, rude to passengers, sat in the back of the plane on their phones. Hardly professional is it? When trying to get help via a live chat to have the chat ended and not be listened to. Again rude and unprofessional. I will certainly make sure to avoid using this airline at all costs, and I will certainly make sure friends and family no longer use this airline.
## 707 Malaga to Stockholm. Had three choices at booking: regular, plus, or flex plus. Regular had no baggage, plus adds a bag, flex plus (the most expensive) adds fast track or so I thought! In fact flex plus removes the bags, so it's actually worse than Plus. Discovered this after booking. Called customer service 5 minutes after booking, they couldn't care less. It's a flexible fare, so can be cancelled? Wrong. Can I add a bag now, 5 minuter later, for \342\202\25425? No. Now 5 minutes later, it costs double. Can I cancel within 24 hours, like every other airline in the world? No. What a terrible airline. Just terrible. Pay the most, get the least. Hate Ryanair.
## 708 We had no expectations, but what a great surprise! It's a simple airline and you get what you pay for. It's a company that transports you from point A to point B and that's it. They fares and fees are simple and very clear. I think some people don't read what is included in the flight ticket and expect luxury travel for cheap. Our flight from EMA to DUB and return flight was on time, very simple and crew on board friendly. We paid a little more for priority boarding for both flights for two people for a little fee. Brilliant airline for cheap travel across Europe!
## 709 On April 1st we flew from Cologne to Stansted. For some reason I wasn't able to check-in online so we (party of 3) decided to check-in at the airport itself where you often have the self check-in counters. So we arrived 2,5 hours before the flight but not self check-in counter to be found. We decided to go stand in the queue for boarding where they can print our boarding passes. They explained that we had to go to customer service first. Arriving at customer service they told us that we had to pay \342\202\25455 per person for them to check us in. I told them that's ridiculous since I tried several times at home and when that didn't work we tried to do it at the airport. Now she is telling us we have to pay an additional \342\202\254165! So I said never mind I'll try to check in by ourselves again whereas she responds that it isn't possible anymore because it had to be 2 hours before and we already passed that so we had to pay. That really started our vacation on a bad note. On the return it was just as bad. Thankfully I did manage to check-in this time but we had priority check-in yet they just let everybody through the gate already. When we came downstairs to walk up to the plane we had to wait for almost 30 minutes, mind you, I was not able to go anywhere besides standing there and while being pregnant! Very annoying. Once we finally got on the flight the two stewardesses were very unprofessional! They were rude to other customers based on their looks, they were dancing and joking and talking about other customers. It was such an uncomfortable experience and really not happy with both flights!
## 710 Berlin to Milan. What a terrible, terrible airline. I booked my flight and tried to check in on the way to the airport Sch\303\266nefeld in Berlin. It did not work, and told me instead to check in at the counter prior to 40 minutes before my flight. I was there and talked to the ticket agent, but she told me that I would have to go pay \342\202\25455 to check in and get my boarding pass. That was not shown anywhere on the emails I received or sign-up page, and is clearly a scam to make more money. The representative also said there was not enough time to even check in although I had followed the instructions, and so I missed my flight. They rebooked me to a later flight to a nearby city five hours later for nearly the price of the entire first ticket, and I will also likely have to pay more for the train ticket to get to my original destination.
## 711 East Midlands to Dublin. We had no expectations, but what a great surprise! It's a simple airline and you get what you pay for. Please don't expect a luxury first class for a little money. It's a company that transports you from point A to point B and that's it. They fares and fees are simple and very clear. I think some people are just ignorant and they don't read what is included in the flight ticket and expect luxury travel for cheap. Want more comfort? Pay for it, it's so simple. Our flight from EMA to DUB and return flight from DUB to EMA was on time, very simple and crew on board friendly. We paid a little more for priority boarding for both flights for two people and we are still alive for that a little fee. Brilliant airline for cheap travel across Europe!
## 712 Faro to Birmingham. Typical Ryanair efficient with no frills but no problems provided you check their rules. Staff are generally friendly and I was greeted by one staff member who remembered me from previous flights and managed to get us better seats. The new food menu looks an improvement with wider choice although we only had coffee. Ryanair now have 'enhanced seating' in the first 5 rows but this means reduced pitch for the rest. I now measured it at 29" generally and only 28" in row 33 (the last row) which meant an uncomfortable return flight with the flight being completely full.
## 713 Milano to Hamburg. The bad service is simply frustration. Many hidden costs like the 55\342\202\254 airport check in fee. Although it looks cheap at first glance leave your hands off Ryanair.
## 714 Malta to Stansted. Never again Ryanair. I really don't recommend after a bad experience again. After 3 years I hope to never fly again with this airline. Staff serving were really rude. Pay more for another company you will be secure and at the same time you will not be ripped off.
## 715 I booked a return flight from Berlin Sch\303\266nefeld to Riga through Ryanair. After receiving my check-in reminder, I tried to check in online, but it wouldn\342\200\231t allow me to select any of the buttons to proceed with the chek-in due to a technical error, so I tried again later that evening, but it was doing the same thing. I then tried checking in 3 times Tuesday the 9th, but it was still not working. The last time I tried was Wednesday morning 2 hours before my flight, but the site was still faulty so I went to the airport to check-in in person. The Ryanair service desk charged me an additional 60 Euro for late check-in. He said that he checked and that there was nothing wrong with the website. This was not true as I called their call center, and they confirmed that they had problems with their website as well as the app over those days. When I arrived in Riga, I saw on Facebook that other people was also complaining about the website not working properly during those exact days. I took screenshots of this as proof. We called Ryanair customer service on the Wednesday and one of the sales consultants confirmed that she is aware of the technical problems Ryanair was experiencing on those days. She said I should get the 60 Euro back without any problems. I wrote to Ryanair asking to refund me the 60. euros, but they replied saying that it is my responsibility to contact them in case their website is down, thus they refuse to refund me. I find this dishonest as a company shouldn't benefit fat the expense of a passenger from their own website being down. To add further insult to injury, the cabin crew insisted on measuring my hand luggage 3 times in between walking through check-in and getting onto the plane. It was like they were desperate to try and extort even more money out of me. Needless to say my luggage fitted in the frame, all 3 times. I'll never fly them again. Neither would anyone in my family.
## 716 Bucharest to Stansted. I booked a flight from Bucharest to London, with the intention of connecting with a flight from London to Lisbon. Upon boarding the flight and heading for the runway, we were informed there is a problem with a sensor in the aircraft. It took 45 minutes to repair and another 45 minutes to refuel the aircraft (while we were still waiting inside the aircraft). This made me lose my other Ryanair flight and caused a lot of problems and unplanned costs. Since the delay was less than two hours we got nothing but a short apology. I would not recommend Ryanair because of this issue.
## 717 Absolutely awful airline. Travelled with them last August to Corfu, awful service, nothing like Easyjet, swore I never would again but unfortunately made the mistake of booking with them recently via Loveholidays. Two weeks after booking I needed to change one of the parties due to one person not being able to come and even though we had yet to enter in passport details and I made the changes online, they charged \302\243115! Not only that but you can now no longer take a small case into the hold, only a much smaller bag that fits under the seat, so we were also charged extra for the small case. Looking up other airlines, Easyjet still has the small case as a free hold bag and only charges \302\24325 to change a name. After this, definitely no more Ryanair!
## 718 My flights to and from Tenerife were on time. There was a great selection of food and drink to purchase. The cabin crew were friendly and visible on both flights.
## 719 Bologna to Stansted. It's easy to complain about Ryanair, but if you follow their booking instructions correctly, the vast majority of gripes about luggage etc can be avoided. The flight was more or less on time leaving, the staff were efficient and reasonably friendly, they use tried and trusted aircraft and get you there safely. It would be good to have more staff serving drinks so you don't have to wait so long if you sit at the back, but otherwise, what do you expect?
## 720 Prague to Madrid. Everything about Ryanair is bad. Bad support staff at the airport. No information on that you have to pay additional at the airport for the ticket. Rude staff, not at all seamless.
## 721 Cork to Luton. I flew with Ryanair on the 17th of March, from ORK to LTN, and back again from LTN to ORK on the 20th of March. On the outbound journey, everything that I experienced went smoothly. Boarding began ~45 minutes before the scheduled departure time, and I did have to wait longer because of not ordering Priority but the gate agent was friendly and it went by with no issues. Boarding the plane was easy too, with not too long of a wait outside, and the attendant greeted everybody with a smile and a welcome. I sat in seat 27F for both of my flights and the seat was comfortable, had great legroom and the seatbelt wasn't too short or too long. The seat was positioned perfectly near the window so I could get some great shots of the wing and the outside. When flight service began, I had headphones in so the flight attendants didn't disturb me, which I thought was kind of them. The flight was smooth and the landings were a bit rough, but it's to be expected when they need to disembark the plane and get it turned around in 30 minutes! All in all, I had a great experience with Ryanair and I would fly with them again.
## 722 Everything about Ryanair is just uncomfortable. Compared to easyJet the seats are worse. There is something uncomfortable about them. Also, my last flight was delayed on the runway for over 2 hours. I have never had a delay with easyJet. I am currently writing this review because I just received notice there will be a delay for my flight today. Second in a row. Yay Ryanair! Also, some of the "window' seats just do not have windows. It is the most absurd thing to be told you have a window seat and instead have a wall. Its also slightly unnerving to not know the exact moment of touch down. If you are looking to save costs do it with easyJet, not Ryanair.
## 723 Bucharest to Bergamo. Quick boarding, great flight, arrived early! Everything went very well, not a problem. Great flight and great landing! I love Ryanair!
## 724 Tenerife to Bristol. Had to pay \342\202\25440 for our hand luggage as it had to be checked into the aircraft, unaware of this as we had bought out tickets with the promise of a small bag as hand luggage which is what I had. The stewardesses were rude and blunt telling me it was \342\200\234impossible\342\200\235 to get my bag on the plane which clearly it wasn\342\200\231t. My bag was then taken off me on the steps up to the airplane which I was again not informed would happen. Will not fly with Ryanair again.
## 725 Barcelona to Birmingham. Shocked that "priority" had sold out so were to we would have to check in cabin luggage. I've never done this before and didn't like carrying my possessions in a carrier bag. Flights ended up with extra costs to be more than Vueling who were miles better.
## 726 Alicante to Brussels. Totally disappointing experience, Ryanair has a questionable policy regarding the suitcases, I had to make a first payment for shipping a small suitcase weighing less than 10 kilos, when embarking I had to pay \342\202\25420 extra for not having checked the suitcase, finally the cost of the flight is more expensive for this reason, there was another extra cost to be able to choose a seat as the seat allocation system assigns you separate seats from your family members so that you have to pay an extra to travel together. Uncomfortable seating, unhelpful staff, dirty plane, stressed hostesses asking passengers to sit down, I have a lot of experience on flights with many companies and I consider that Ryanair is by far the worst experience a traveler can find, low quality and deceptive policies with the passengers. ES: Experiencia totalmente decepcionante, Ryanair tiene una pol\303\255tica cuestionable en lo relativo a las maletas, tuve que realizar un primer pago por embarcar una maleta peque\303\261a de peso inferior a 10 kilos, al embarcar tuve que pagar 20\342\202\254 extra por no haber facturado la maleta, finalmente el coste del vuelo es m\303\241s caro por este motivo, hubo otro sobrecoste para poder elegir asiento pues el sistema de asignaci\303\263n de asientos te asigna asientos separados de tus familiares para que tengas que pagar un extra para viajar juntos. Asientos inconfortables, staff nada servicial, avi\303\263n sucio, las azafatas estresadas pidiendo a los pasajeros que se sienten, tengo mucha experiencia en vuelos con muchas compa\303\261\303\255as y considero que Ryaniar es con diferencia la peor experiencia que un viajero puede encontrar, baja calidad y enga\303\261osas pol\303\255ticas con los pasajeros.
## 727 Manchester to Madrid. A good company to travel with until your \302\243500 baby pushchair gets lost during transit and found after two days, just to discover it is destroyed and you have to make a claim! Ryanair airport staff from Spain speak little or no English and no one seems to be interested in helping you with the matter. We filed a claim form and provided photographic evidence that the pushchair has broken hinges and impossible to use any more. Less than 10 minutes after our claim was sent, a reply came from Ryanair office stating that the claim is rejected as there is just cosmetic damage!
## 728 Dublin to Faro. I travelled with my family of 5 to Faro, the itinerary was changed 3 times which meant that the man in our apartment had to stay late to check us in. Boarding in Dublin OK and flight quite good. Staff very polished and professional, on return boarding in Faro was a free for all, priority and non priority all boarding together. Flight back was good and we arrived half hour early in Dublin and straight on to a commuter coach back home. A good quality product, I am flying with them again next Monday and I will not be priority as I think it is a complete rip off along with the seat selection. Pack wisely and bring laundry tabs, sandwiches, snacks for trip and empty plastic bottles which you can refill in airport. Much cheaper than EI on the same route.
## 729 Stansted to Vienna. Was on a flight from Stansted airport when the engine blew on take off, had to emergency exit the plane onto the runway and be bussed back to the terminal. The staff were amazing you could not have asked for a better service. As we entered the terminal we were handed water, our names were checked off and then we were given sandwiches, crisps and chocolate. Within three hours the backlog of planes were moved and they had us on a replacement flight to Vienna, all the staff were extremely courteous and were very professional. I cannot recommend this airline and there staff enough, thank you for getting me to my destination under the most difficult of situations.
## 730 Found the service to be horrendous when travelling home from krakow to Manchester. When checking in the staff kept interrupting our checking in to check other people in who was on another flight. When we was waiting to board the plane we was left outside in the freezing cold for 20 minutes as we were delayed half hour while all the priority customers were on a heated shuttle bus waiting to board plane. Feel like if you didn\342\200\231t pay the extra you didn\342\200\231t matter. Never fly with Ryanair again!
## 731 Stansted to Lanzarote. Left on time, arrived on time, good flight, good service. Nothing to say. All for 52 pounds included seat, handluggage on board (Priority). What would anyone expect for that amount? In England a train to Oxford can cost more.
## 732 Amman to Paphos. Price is very cheap rather than other available flights, My luggage had been delayed (it was an airport mistake) but the company deal with my case in a professional way
## 733 Dusseldorf to Marrakesh. A flawless flight with Ryanair, which started at convenient and small Airport Weeze. Annoying waiting outside in the cold before boarding, but I can understand why: FR's middle name is efficiency, so it's better to have all passengers lined up in front of the plane. We had two pieces of hand luggage and were on seats 1A and 1B which was great. Miles of legroom and no-one besides us. Plane departed on time but had to make a detour because of a strike in Belgium. Therefore flight took a little over 4 hours but not the airline's fault. Nice crew which made two rounds with reasonably priced food and drinks. Inbound flight equal: on time and comfortable because of seats at the emergency seat, which is well worth the euros on a 3,5 hrs long flight. People who are complaining that FR is not clear about the obligation to print the boarding pass are wrong: they make that very clear. Not able to print? Use the app, because on almost all routes -not from Morocco though!- you can use a mobile pass. Very easy and no hassle.
## 734 Warsaw to Belfast. Terrible. They want money for everything you do. Not worth flying with them. Pay extra \302\24320 and get yourself a trip with a different airline. I had to pay extra for a seat with my partner as they set us 12 rows apart. Then apparently I haven't had my check in bag (paid for it) and then had to pay extra as it was a "wrong type of bag" Customer services is helpless so if you have any issues, be prepared for nothing being done about it. I am waiting for a refund (over 3 weeks) but all they're saying that they've sent it. No confirmation sent to back this up. It's absolutely ridiculous to how this company still stands.
## 735 Bremen to Tampere. I am flying often with Ryanair. They are sort of reliable and of course cheap. That\302\264s it. The rest is negative. I would recommend them only if the route is served nearby. I would not use them if other airlines fly the same route. Good is the pricing system. You can book one-way flights for the same price as a return.
## 736 Prague to Ovda. Its was my first time that I flew with Ryanair and I am really disappointed. When we took the flight from ovda all was good without any discomfort. On the way back they check every little thing and when I ask where all of this instructions are written they didn't had an answer. And just did its a lot harder. I really would consider next time if to fly with this company.
## 737 Palma de Mallorca to Barcelona. Easy and quick check in, ground staff at Palma de Mallorca airport was nice, the flight left on time, the aircraft was clean and the cabin crew was really nice and polite with good english.
## 738 Barcelona to Palma de Mallorca. Easy and quick check in, aircraft was clean, staff was quite friendly, although there was a little bit of delay due to late arrival of the aircraft. Would fly again.
## 739 Palermo to Milan. Terrible experience. One staff member at the Palermo airport in particular was incredibly rude and out of line. As soon as we got to the check in counter we were scolded by the Ryanair employee for not printing out our boarding pass (something we didn\342\200\231t know as this was our first time flying Ryanair). We were instantly met with a disrespectful attitude that was unprompted. We were sent to a different counter to print the boarding passes for 44 euro. Coming back to the check in counter we were met with more scolding for having bags that exceeded the weight limit. The employee was basically appalled that we had extra weight and again sent us to the other counter to pay for being overweight (205 extra euros!). We already knew before coming to the airport that we were going to have to pay a fee for the extra weight so again we were met with unprompted disrespect; we even told this employee that we understood we had to pay more and we\342\200\231re okay with that but again his reaction was demeaning and unwarranted. We did not talk back nor initiate any disrespectful dialogue and hence why I am prompted to write this review. We barely made our flight because we were setback with these additional waits which I believe all the services should be done at one counter. This whole experience put a really bad taste in my mouth with this airline. I never got the name of the person who was so rude to us because we were so frantic to get our boarding passes and paying for extra weight. I am displeased with the customer service presented. This person needs to learn how to be respectful and accommodating rather than scolding at a stressful environment to begin with. The extra fees, rude employee and hassle to board a Ryanair plane is the reason why I have to give this airline a 1. Wish it could be a 0 though sadly.P
## 740 Stansted to Rabat. When booking our flights, we made two errors: 1. we booked through kiwi.com, which meant Ryanair really couldn't help much. A mistake was made in entering my first name; in other words, my husband listed his first name for both passengers: Mr. S _____ and Ms S ______. When we noticed the error, we first tried finding a solution through a Live Chat with Ryanair. They kept asking for the email address with which the flight was booked. It turns out that since we booked through a third party, kiwi.com used their own email address. When we contacted them, they informed us they couldn't give out that email address. When I tried to manage my booking to change the name, they wanted to charge 382 Euros--a ridiculous price set by the airline (and the cost of 2 new tickets). And it turns out that no one could do anything for us. When we tried to cancel the flight, not only were we unable to recoup even the cost of the prepaid luggage fees, but kiwi.com would charge a 20 Euro cancellation fee. So we simply didn't show up for the flight and made other arrangements to get to Spain from Rabat! Pretty bad experience--lots of psychic energy wasted for nothing--for a simple data entry mistake!
## 741 Flew Ryanair from Athens to Berlin. The flight tickets are reasonable but again in the time of boarding in the airport these airlines will make you to pay so many fines. I didn\342\200\231t download my flight ticket online and for that they charged me \342\202\25455 and I also paid online for baggage, again they charged me \342\202\25422 for another small cabin bag. I\342\200\231m really frustrated about this. The staff are very rude. Do proper research before choosing Ryanair.
## 742 Paris Beauvais to Prague. Never again. The flight was delayed about 7 hours. No apologies. No food, no drink. Nothing. Only thing they do was that they add an hour or two to the departure. The airport in Paris - Beauvais is too small, people are lying on the floor, there\342\200\231s no place to sit.
## 743 Athens to Thessaloniki. Used the app to check in and everything was going fine until I reached the gate, about 40 minutes prior to departure, only to find out there was a 2h30min delay. We received a 5\342\202\254 e-coupon which could be used in various stores. According to the airline this was due to a technical fault, and we had to wait for another plane that was coming from Warsaw. I'm sure they knew of the delay earlier, but somehow they missed informing the passengers. On the other hand Ryanair uses the satellite terminal in Athens, which is a bit far, however passengers walk to the aircraft and they can use both front and back doors to enter, so this is fast and easy. The flight cost 24\342\202\254 return, so it was very cheap.
## 744 They probably need more passenger on the plane cause it looked like they add seats till people don't have any space for the legs anymore. The only position allowed is a straight rigid firm sitting. Impossible relax, impossible stretch, impossible rest! And that's why they reduced the bag sizes cause they're embarking more ppl on the same plane. It was a horrible experience.
## 745 Lisbon to Frankfurt. Horrible service and hidden fees doubled the price of the tickets day of the flight. This is a joke and the smugness or the representatives that send you from one to another is indicative of how common this is for them.
## 746 Manchester to Lanzarote. The worst customer service and business skimming is untrue. Even though you\342\200\231ve paid for the flight and the check in bags, they rinse you for every penny you can get, I paid \302\24320 to be billed another \302\24340 at the gate for not checking in a bag, then almost missed my flight as they wouldn\342\200\231t let me through with my bag as it was .24kg over the weight. Don\342\200\231t use this airline, just that little bit extra to get that much more. With Ryanair you pay for the extras then they don\342\200\231t matter anyway, then the extras you pay for don\342\200\231t get used. Seriously avoid this airline.
## 747 Great, easy, quick flight to Stansted. Ryanair has such a bad reputation but I dont understand why. If you follow their guidelines, you wont get charged, its that simple. Everything in-flight was clean and tidy, although there is no inflight entertainment.
## 748 Manchester to Madrid. I have flown with Ryanair many times and none of these trips were ever pleasant. But more recently in January I experienced the worst customer service and a charge to my credit card by Ryanair without my consent. They have introduced their new cabin bag policy which is utter garbage, because when you opt for the priority this not available, so Ryanair can charge you an extra \302\24325 at the gate. As for the charge to my credit card for flight I did not take nor was I acknowledged of this transaction, Ryanair\342\200\231s response was very blaze and told me there is nothing they could do about it.
## 749 Palma de Mallorca to Madrid. The boarding was really quick, the aircraft took off on time and the bags were already in the belt to collect when I arrived. Crew was really nice. Good experience.
## 750 Barcelona to Palma de Mallorca. Fast boarding, crew was nice and professional. Landed on time, check in bags already on the belt by the time we reached it. Overall a good experience.
## 751 Malaga to Stansted. I would never choose Ryanair again (this was my and first time), I also recommend everybody else to avoid this company. The worst customer service and they will make you pay extra for everything.
## 752 Ibiza to Barcelone. Ryanair is the worst airline. We had a 8 hour delay in our flight. According to the EU regulation we should have a compensation of 250\342\202\254. It\342\200\231s been 3 months that we exchanging emails with Ryainair requesting the compensation! Everytime, they find a new excuse and we still haven\342\200\231t received the transfer!! Now they say that they send the transfer in November and even if we are stating and proving (proof from the bank) that we haven\342\200\231t received the money, they now say that they cannot do anything. This is the worst service I ever received. We only exchange emails as communication way because it is the only way we are able to communicate with them!! We tried all phone numbers to call them and never been able to reach them. As if their numbers don\342\200\231t exist. It is inaceptable that we cannot reach them by phone. So everytime we email Ryanair, it is always a different person answering us without taking time to look at the problem! .
## 753 Prestwick to Tenerife with Ryanair. Only wanted to cancel my bags and seats, not my flight. Would not allow me as company policy don't cancel anything. Customer services the most unhelpful people ever. Book elsewhere. Date of travel: January 2019
## 754 Brilliant airline, allows people to experience flying for next to nothing. Paid \302\2439.98 return for this flight, read the website and stuck to the rules, didn\342\200\231t get charged extra. On a 2 hour flight, comfort is not a huge factor, I found Ryanair average, but no worse than easyJet. Staff friendly on return leg, seemed tired on outward leg. As long as they do their safety part fine, not a big issue, and I\342\200\231m sure they did.
## 755 Barcelona to Seville. I am very disappointed with this experience. 1st it was a hidden fee that would make any airline untrustworthy. I had to sufficient fund at airport for not checking in 2hrs ahead of the flight. The staff has no manner or respect for a confused and shocked passenger. I was at check in counter #68 at 7:30 am, two guys were there and treated me with no respect.
## 756 Prague to Barcelona. We tried to check in online using our phone but we cannot enter the birth dates. We were not aware that the airline charge 55 Euros per ticket for not checking in online and print the boarding passes. Later we found out from reading the email that we have to check in online to avoid the fee, but it was after the fact. This requirement was not made aware when we bought the ticket. We are trying to contact the customer service for a refund, but not successful so far.
## 757 I was flying from Thessaloniki to Bologna. The weather was terrible (heavy snowstorm) and a lot of flights were either cancelled or rerouted. However what happened with Ryanair was unprecedented. Although all passengers from other airline companies were brought to their hotels by around 2.30 in the morning, passengers from 3 Ryanair flights were moved out of the airport at around 7.00 in the morning. In the beginning, the company did not officially cancel the flights so we were not allowed to take our luggage. Afterwards, we were not properly informed whether we should change our tickets (Ryanair was not going to send an aircraft the next day, so passengers would have to wait 2 or 3 days at least to fly to their destinations). ask for a refund or wait to catch a flight the next day. In addition, the online application did not work, so we had to form endless queues for any option we wanted to follow. In general, the situation was chaotic. The company is totally disorganised and left 3 or 4 employees (for whom there is absolutely no complaint, they were trying to do their best) to deal with more than 400-500 passengers (from 3 flights) without having the proper instructions from their headquarters. During the whole night that we stayed in the airport, I was under the impression that the company policy was to make us book our own hotels and therefore save the company some cash. In that respect, Ryanair vouchers are half the price compared to the other companies and they are being announced in a -kind of- secret way!!! The next day the weather was sunny so Ryanair started accommodating the flights of that day, so that the company would not have to deal with more delays, refunds etc. This resulted in the passengers of the already delayed flights being stranded at the airport for 2-3 days without any information (their flights were not even shown in the "departures" table). The situation was "resolved" when incredibly angry customers demanded to catch the next Ryanair aircraft available. After a lot of fights with the personnel and the person in charge of the airline (police presence was deemed necessary) I believe we finally boarded a plane with a different original destination. Flight was acceptable, although Ryanair did not even consider offering a bottle of water to the passengers. Do yourselves a favour, give some extra money and travel with a different company. No matter what the weather conditions are, you will at least be treated with respect, like normal human beings (again I am talking about the policy of the company, not the personnel in particular).
## 758 Bordeaux to Stansted. With each flight this company disappointing more and more. First they changing luggage policy claiming it will reduce delays, however it is clearly to gain more money. People are going crazy and booking priority which we just realised is limited. Before you could drop-off larger size bag at the gate without extra fee. Well that has changed now. Ryanair \342\200\234kindly\342\200\235 informed us on January 1st 2019 that from December 4th 2018 we have to pay 10\302\243 for it. Well Ryanair, there is clearly some problem with timing! Ripping us off the money like this? So not honest and unacceptable! Thank you but no thank you.
## 759 Rome to Brindisi. I had never booked a flight with Ryanair so I wasn't aware that it was mandatory to check-in prior to arriving at the airport. They charged me a penalty of 121 euros for the two tickets! I didn't receive a text nor email telling me to do so to avoid the fee. I was told by the agent that I should have read the terms and conditions. The site stressed the fees for baggage during the booking but nothing was said of the necessity to check-in online to avoid the fee. If they want everyone to read the fine print, then don't say anything about the bags. I'll think twice before patronizing them in the future.
## 760 Frankfurt to Krakow. Ryanair tries to rip-off their customers with their new & confusing baggage allowance policies. They wanted to charge us twice for the exact same piece of luggage (regular carry-on luggage), just ridiculous. We bought two regular Ryanair tickets approx. 3 weeks prior departure for 225\342\202\254 (round-trip) per ticket on the Ryanair website. When I tried to check-in online, I realized you have to pay for luggage larger than a laptop case. We decided to check-in at the airport in FRA and asked at the counter whether our Ryanair ticket for 225\342\202\254 really does not include a regular carry-on sized piece of luggage? They told us no and we had to pay 10\342\202\254 per carry-on luggage/way extra, which means that we paid 40\342\202\254 for our small, only luggage for the out- & inbound flight additionally. Consequently, our ticket FRA-KRK-FRA added up to a total of 245\342\202\254 pp. Definitely not a low cost price, but unfortunately, we had no other option. We paid the additional costs without big discussions and received an invoice, clearly stating our names and the amount of 40\342\202\254 in total for the in- and outbound flight for two. When we were flying back to FRA from KRK, they wanted to charge us again for the exact same carry-on luggage we have already paid for despite showing them the invoice. The Ryanair staff behaved unreasonably and did not even show a bit of understanding (even other people passing by were saying that the baggage regulations are really confusing) and were just threatening us to either pay or stay in KRK! I was showing them my invoice and saying that I am not gonna pay one more additional penny and they instantly said that we would have to stay. I was freaking out in front of all passengers and it took 5 more minutes of discussions, threats and shouting until they finally let us go without paying. I will never fly Ryanair again that is for sure, even if other airlines would be more expensive.
## 761 Luton to Malta. Absolutely disgusted with the staff at Luton airport & Ryanair. I paid \302\24340 for priority boarding to get to the airport to be told I had to pay an extra \302\24310 to take my bags or I couldn\342\200\231t get on the flight, never in my whole life of travelling have I come across such nonsense and attitude. Will never fly with Ryanair again!
## 762 Luton to Marrakesh. Myself and my family booked flights to Marrakesh to have our Christmas holiday abroad. Our flights we're on 20 Dec 2018 and returning on the 27 Dec 2018. We booked and paid in full 5 months in advance (July 2018) going with Ryanair but returning with easyJet. I had to pay extra for priority cabin luggage as they made the cabin bags optional. When I booked my outbound flights in advance my flight time was 15:05 and reaching my destination time was 18:40 but a month before my travel I have received a email from Ryanair air stating my flights time was changed to 16:30 departure from Luton. I couldn't find a number to contact Ryanair so there was online Ryanair customers service agent chat. I chat various people stating if my flight can be put to earlier flight and nobody was able to help me. I asked if there was any compensation for changing the flights but as soon as I mention the word compensation my chat ends (goes off line). The sad part was I booked my coach seats in advance too and I couldn't change the time as it cost fee nearly half of the coach price to make amendments. So we arrive very early at Luton airport. And the departure time suppose to be 16:30 but we took off at 17:30 and arrived an hour late at Marrakesh. I feel bad as our Marrakesh hotel airport transfer had to wait over an hour for the delay.
## 763 Madrid to Stansted. Had a very bad experience. I\342\200\231ve flown with Ryanair several times and never had to print the ticket. However, we were told to print the ticket and get the stamp on it this time. It wasn\342\200\231t explained clearly on the boarding pass and the staff was so rude. We missed the flight and they told us the next flight is two days later. Seriously, I can\342\200\231t understand why this company still exist. I\342\200\231ll try to get the refund but I\342\200\231m worried that if they\342\200\231re going to pay me back.
## 764 Poznan to Stansted. Check-in and baggage policy changed and they made us pay about 100 GBP more for the trip plus throwing away expensive cosmetics we needed. Flight about 2 hrs late both ways. I was 30 weeks pregnant at the time and no one even offered a glass of tap water on board in the heat. Rude flight attendants. My partner and I had separated seats. And forget about getting in touch with customer service.
## 765 They are constantly changing rules, even the staff don\342\200\231t understand the new policies anymore. We booked a flight in August and the policy about the hand luggage changed in November. We were not able to change our ticket to priority (because that is what you need to do if you want to take your hand luggage with you in the aircraft) so we added the luggage during check-in. This costs us 10 pounds. At the gate we were informed that we had to drop our luggage at the check-in desk (which was not clear at all) so we had to pay an additional 10 pounds to take our luggage in the aircraft. Once in the aircraft we were told that we cannot take our luggage in the aircraft. After explaining everything to 3 different people, they finally let us go and we were able to take our luggage with us. Really Ryanair, just make sure you get your staff trained and don\342\200\231t change your rules and policies all the time. They will definitly lose a lot of customers. Never in my entire life I will fly Ryanair again. I rather pay 50 pounds extea for better service and clear policies.
## 766 Copenhagen to Bologna. Ryanair has gone too far. Constantly changing rules to earn few extra euros - unprepared staff, loud ads running during the flight, flight attendants turned to bazaar vendors selling all sorts of unnecessary items (who buy those by the way?), no frequent flyer program, no waiting lounge, no free customer service number. And now that ridiculous new rule on baggage is confusing, unfair and so time wasting. I can\342\200\231t really see the business sense of all that either. I take Ryanair when it goes where the other airlines don\342\200\231t go, not because of the cheap tickets. Charge me what is right for my ticket but leave in my peace before and during the flight. Your fading stock price will probably thank as well.
## 767 Stansted to Shannon. So you pay for priority boarding? You're wasting your money. The queue for priority boarding was 100 people long when I joined the queue and even longer behind me after 30 minutes. The non - priority queue? 4 people when I joined the queue and about 20 or so when boarding started. So you pay for priority to carry your case on board? Don't bother - the non priority queue had cases just like mine. But the non priority queue on the other side of the barrier will board after the priority queue? Are you kidding? the non priority queue got on the same bus at the same time as the priority queue and a lot quicker as well as there were so few of them. Nobody supervised the gate - the automatic door opened and we all got onto the bus together. The gate number was 90. On board, it was fine - I had a window seat on both journeys (despite not paying for a seat reservation) and was happy counting the revenue stream as the bags were loaded into the aircraft hold. I counted several thousand pounds worth of revenue for Ryanair on the assumption that the bags were priced at \302\24325 each. Ryanair are very clever in convincing the flying public to pay for priority when there is no priority - and even more clever in marketing the product so that the majority of your passengers actually take the option. I suggest that as the public catch on to this cunning revenue maximising plan you will have to change the rules again as "priority" boarding is probably breaking some trade description act and the public aren't stupid. However, despite this little rant, don't forget that Ryanair does offer exceptionally low prices and if it wasn't for them and other similar low cost carriers we'd still be paying extortionate prices to the likes of BA and Aer Lingus and moaning about their high fares and poor service levels. Ryanair aren't perfect but they're a hell of a lot better than many other airlines.
## 768 The worst company ever. Our flight was 23/12/2018 at 14:30 from Athens to Thessaloniki. Without any warning they changed the flight at 21:30 in the evening and they only thing they told us is to stay in the airport for all those hours because if they decide to change the time of our departure again we might miss the flight. The weather is great it\342\200\231s a fantastic sunny day and we have to spend it in the airport. No sorry, no explanation, it\342\200\231s the worst company ever. Dont use it you never know if you will fly
## 769 Bucharest to Paphos. Very disappointed. We have to wait outside, after gate check in line for aprox 40 min. Cold wind was blowing, and we were together with our 2 year old daughter. Not to mention 2 hours delay on the way there. A cheap company. And nothing else
## 770 Very bad experience flying with Ryanair from Tenerife to Madrid, they are waiting for your faults, and if you dont pay abusive extra bills, you dont fly. Never again, at the end, cheaper with any other company. Always the same, lets see if I learn it and remember this for next time. 55 euros the paper in black and white that I show you, printed.
## 771 Ryanair is getting worse and worse. Allocating people travelling together in seats far away to one another in orher to have people to pay more money is really shameful. How can you be so greedy to put safety and comfort in second place? The airline reached the lower point to me. As much as I can I'll try not no flight with them anymore, even if that mean paying more for another flight.
## 772 Dublin to Edinburgh. Ryanair refund policy on their website states that the serious illness of a customer booked to travel may at the discretion of the airline be refunded. My daughter was unable to take a trip due to a positive diagnosis that included a Dublin hospital visit. I forwarded medical info as per Ryanair policy. Ryanair response: "Ryanair tickets are non-refundable. I sympathize with your circumstances but I am not in a position to process your request." There was no consideration given to the medical situation or explanation why my daughter's case did not qualify. Buyer beware that Ryanair policy is meaningless.
## 773 Made two trips recently with Ryanair and on those two trips we left late (almost one hour). Boarding is slow. With their new policy of paying for the once free cabin luggage everyone has priority so its really just more of the same under a different name - this is my experience of observing their boarding process. Staff could be more friendly but that's not a major issue. They're polite and know what they're doing. Food looks expensive but smells good - so far I've only tried coffee so can't say much about it. The seat space is appalling. Also they really seem to split people that travel together when you select random seat allocation - I understand its random but seems quite unnecessary and makes it look like Ryanair only really cares about your money. Also, if you travel alone you're "random" seat allocation is the middle seat which is not that random as it should be.
## 774 Leeds to Krakow. They made us wait outside at zero degrees for half an hour before the flight which was absolutely not acceptable especially for elderly and children.
## 775 Barcelona to Dublin. This is to make a complaint about Ryanair desk staff in Barcelona Terminal 2 who I asked about visa checks and answered me rudely. I asked about the boarding pass print since I can't retrieve it through the app since I'm not a European national. So when I asked for the print and stamp he told me, how can he stamp my boarding pass in my phone screen. I found it rude so I raised my voice a little high and asked him again only the he gave me proper instructions. This people should not be tolerated. Please make actions on it.
## 776 Weeze to Faro. At the end of October 2018 I booked my flight with full enthusiasm. In addition to the flight and hand luggage, I have also booked the shuttle transfer and paid. Unfortunately Ryanair did not pass my payment to the shuttle provider Viajes Russadir. This week it starts and will have to book another transfer and pay. I can advise everyone to book special services with Ryanair. Ryanair is pulling its own customers over the table. The "Support / Service" is the worst I have ever experienced. After about 30 emails I got the same answer that they can do nothing and I should contact the shuttle provider. What should they do? They did not receive the payment, that means no transfer. The last 10 reactions from Ryanair were then copy & paste: the position would remain the same and that the matter is now clarified. I visited the Facebook and read the running volume, that the support is bad or there is no compensation. So you can be lucky if everything runs smoothly or bad luck. In future I will not book any special services by an Airline. You have no trouble if the payment is not forwarded by the airline. Ryanair is not interested and withdraws from the responsibility.
## 777 Stansted to Belfast. We had to cancel our flight. That's when the complications occurred. nasty online system that produces few alternative flights, rubbish telephone support team who repeatedly put the phone down on you (this happened 3 times out of 5 calls!) and at the best of times while you've still got them on the other end of the line they are so foreign that they ask you to repeat every 10 seconds, and get muddled in between times! I got so frustrated that I am vowing never to use Ryanair again even if they are cheaper than Easyjet.
## 778 3rd December Flight. Being someone who is afraid of flying I couldn't have asked for more. Getting up those stairs into the plane is the hardest part, I also wasn't sat next to my partner so I was very tence and a little upset. So after they noticeably saw me distressed the Captain and the stewardess first reassured me that I would be sat with my partner (at no disturbance to anyone else) and asked me if I wanted to see the cockpit to be reassured about the plane. Here I met the pilot, an extremely helpful and knowledge man who walked me though a few things, told me the weather conditions, direction of the plane etc. Anything and everything I need or could have wanted to know. I just want to thank the pilot and his crew for being so understanding. The food was great and the selection was good aswell. The plane itself was nice and very clean.
## 779 Treviso to Budapest. Beware, if you happen to book by phone the Ryanair website wont let you do the check in online and at the gate they make you pay 55 euro for the boarding pass. Modern robbery. A straight forward rip off.
## 780 East Midlands to Dublin. Yet another Ryanair flight where most passengers are booked as 'priority' - the queuing ropes had to be repositioned as the priority queue was so long. Less than 20 in the 'other Q'. Same on flights last week. Have to give it to Ryanairs marketing strategists - if you want to take on board baggage you have to book priority, which leaves those that genuinely want priority finding over 100 passengers in front of them. If is was funny it would be hilarious - but it isn't funny, its Ryanair's latest profiteering strategies at its best!
## 781 Luton to Dublin. It was a rather nice flight. Boarding was orderly as they were using both sets of stairs, The only issue was I had to buy seat to check in online. It was 29 hours before the flight. No other option unless I waited.
## 782 I booked a flight for 2 people from Bologna to Catania on Ryanair through the Wanderio website. At the airport the Ryanair agents told me I owe $60 for a check-in charge, because I did not check-in online as per Ryanair policy. As far as I am aware, the standard practice of all other airlines provides for check in at the airport at no cost. Further, in this case, my two bags had to be physically processed at the counter anyway. Wanderio acknowledged that "the details that we shared in the confirmation e-mail might have not been clear enough regarding this issue". To add injury to insult, it also informed me that the extra charge over the price of the tickets was not $60 as at the airport, but 79 Euros or about $85!. It then offered not a CC refund as I requested, but a voucher for that amount for future bookings, which is worthless to me under the circumstances!
## 783 Stansted to Frankfurt. Horrible gate organization. The PA calls the passengers at 18.30 (time when as was expected to be closed) and then we were stuck them almost a half hour. I embarked at 7.10 (scheduled time for departure 7). No explanations, no excuses. Fortunately, we arrived in Frankfurt only half an hour late. Return flight really upset, they put rules on baggage policy and at the gate the land hostess was boarding people who even had not paid the priority were with two bags saying "remember it for next time". So everyone who paid the extra is just stupid or what?
## 784 Paris Beauvais to Budapest. A delayed flight and no announcement were made, ground staff could have made a little effort to inform people. Although everything went smoothly on the aircraft.
## 785 Kiev to Warsaw. Can you imagine feelings of two fans of famous rock band who had been waiting of the concert for ages but had to be awaiting the scheduled flight due to it was delayed for more than 5 hours? We had prepaid concert tickets, our staying in hotel, transfer fees to the hotel, and return flight tickets. There were neither email messages, no SMS from Ryanair beforehand about delaying of the flight at all. Our scheduled departure was about 15:30 p.m and concert was about to start 21:00 p.m. (flying time about 1,5 hour). Our hopes to visit the gig had been melting until 20:00p.m the time when we realized that everything was over. But the worse thing was that we realized that we had been ripped off by Ryanair with their so called cheap ticket prices because all our tryings to fill out claim form to get refunds and compensation on their homepage were nightmare to complete. I rate it's completely ploy for ordinary people. It's occurred to me about their trick : Cheap price - no responsibility at all - and ultimately formal replies from online chat with no help of refunding money! At the end we have no flight, no concert, no money, just vain tryings to correspond with Ryanair. Shame on them!
## 786 Malaga to Prestwick. The most uncomfortable flight I've flown for many a year. Very uncomfortable; no seat adjustment; no radio, tv or films. Also, my case was damaged in transit by Ryanair, but they only give you 6 days to complete their online Claim Form, which requires detailed pages of information, some of which I do not have; so can go no further. So far I've tried 3 times with no success! I do believe this is a definite ploy to prevent folk from claiming. I shall never travel with Ryanair again!
## 787 Barcelona to Porto. My experience with Ryanair was terrible. Staff were incredibly rude during baggage check, payment and boarding. Lines and gates were disorganized stating they were closed when they weren\342\200\231t and sending people at the front of the line to the back. I waited in line to check my baggage for 30 minutes (behind only two other individuals) before being made to pay a late check-in fee (which was approximately 5 minutes past the cut off at which time I was still 2 hours before flight departure). Flight was late taking off and arriving at our destination.
## 788 Cologne to Rome. Very disappointed. Awful experience with the online check-in process and the customer service I got here at Cologne airport by from Ryanair staff. I didn\342\200\231t know my online check-in has not worked until I got to the airport. There was still time to departure (around 40 minutes, yes not two hours but still good enough) but no one even tried to help me. They firmly gave a big no to me and didn\342\200\231t even try any alternative solution. Hearing a no after seeing someone is at least trying to help you is different but I got a simple no without any understanding of my situation. I will never choose Ryanair again and I won\342\200\231t recommend it to anyone.
## 789 Rome to Athens. One of worst check in experience, reasons- understaffed team, hundreds of passenger in queue handled by 3. If you have not done check in online, you have to pay 55 euro per person, pay for light cabin backpack. staffs with blunt expression. One line is avoid the chances of being ripped on the name of low fare because one will end up paying a lot.
## 790 Took a wee break to Krakow from Dublin to visit the Salt Mines and Auschwitz, On time both ways with Ryanair. Lovely staff on both legs of the journey with frequent updates from flight deck. Only suggestion is that they could get nicer wine on their menu. I've no problems with Ryanair, I'd be happy to use them again.
## 791 Pisa to Stansted. Flight did leave on time but very unprofessional ground and cabin crew. I had one small suitcase with me and was forced without any explanation, to store this with the large suitcases. It seems that if you didn't have priority booking the crew had the right to be rude and intimidating. I will never fly Ryanair again, the only reason that I did this time was because I had to buy tickets last minute. I would rather stay longer or for a shorter period at my final destination then to be treated like this. Luggage collection at final destination also took ages.
## 792 Never again with Ryanair is a promise and a suggestion. It is a low cost flight company but we are not animals and even the animals should not be treated like they did with us. The day when this company will close down will be the best day for everybody. My last flight with them was very bad and unbeliveable. I departed from Naples to Bergamo where I had a stop and then from Bergamo to London Stansted. Unfortunately due to the very bad weather, the pilot has decided to land in Verona instead of Bergamo for safety reasons. My flight from Bergamo to London would be departed in 1 hour They have organized the transfer to Bergamo by buses (almost 2 hours) and when we arrived finally to Bergamo, my flight had already left. I went to the Ryanair's ticket office to ask to get the first flight to London Stansted. There I found the worst service ever seen: no customer service, no support, no understanding, crazy queue, only 2 desks and they called you by numbers. It Was a nightmare after a long day. When finally was my turn and together with passengers with my same issue, we have asked to get the first flight to London because was not our fault to have missed the flight. They replied to us that they would have inserted us in a waiting list and they have asked to charge 100 euros each passenger to get the first flight available that maybe would be departed even the day after. All of that without hotel, even a bottle of water. This is absolutely shameful! I really needed to be in London asap and I have decided to pay the fee and fortunately I got the next flight to London. Of course I am trying to get the refund with our solicitors and I will ask even the apologies from them. PS: The lady that works at the Ryanair point in Naples airport (Monday Morning 29th of October) should be fired and she need a very long training. She doesn't know at all what is and what mean the word "customer service". I repeat, never again with Ryanair.
## 793 Flew Palermo to Bucharest. I do not recommend Ryanair to anyone and I strongly suggest to avoid this horrible company. They lost my baggage during a flight, I called daily to the airport, I talked daily to the Ryanair customer service which, obviously, could not help, and in the end I can say that I did everything I could to get it back or to get a refund, but nobody cared at all. The information they give is not clear, the time they put me to wait was between 7 and 21 days and even like this nothing changed. Everybody is sorry, but nobody does anything. Plus, onboard they do not have the food they are supposed to sell. Horrible company!
## 794 Flew Faro to Bristol with Ryanair. The usual efficient but basic experience with flights on time and friendly helpful crew. I fly with 'special assistance' and they are always very good in helping me and assisting with luggage. On the outbound flight weather conditions were very poor - as a retired pilot I estimated ground visibility height at about 200' - and I anticipated a diversion to Cardiff, but the Captain made an excellent landing on a wet and windy runway. We later found out that several other flights had indeed been diverted. The return flight had an unusual incident - because the forward toilet was inoperative, the seat belt signs were switched on in calm conditions to clear a way to the rear toilets for the crafty Captain and First Officer in turn!
## 795 Flew Ryanair from Cologne to Bristol. I fly this journey every couple of months and I cannot remember the last time the flight wasn't delayed at least an hour. If it's going to be a later time just make it a later time! Now we have to pay for 'extras' which any decent airline would not charge for, such as carry on luggage or sitting next to loved ones. So they can say the flight is cheap but by the time you've added on the things you need it isn't cheap anymore. Shameful money grabbing. If Ryanair wasn't the only direct flight for this journey I would fly with someone else, even if it cost more.
## 796 Athens to Frankfurt. Great job by Ryanair. We chose FR because of departure time and price. The price doubled because of luggage and emergency exit seats, but was still low: 680 euros return voor 4, booked two months in advance and much better than competitors. It turned out to be a very relaxed journey: two very punctual flights, with a friendly crew and very comfortable seating at the emergency exit both ways. Good info from the cockpit and I like the efficient boarding.The down side is the risk of strike. A month before we went, there was a big strike across Europe and it won't be the last. This constant unrest makes you worrying about your flight and that's the only reason why I do not recommend Ryanair.
## 797 Luton to Knock. I had not used the airport in several years and was keen to see how convenient it might be for future travel plans. I arrived early and was the first person to check-in for the flight. The check-in agent was unfriendly and did not respond to simple pleasantries. Security at this airport was not pleasant at all and I was stopped and asked to walk through a body scanning machine. Boarding was not at all well organised and one had to stand for almost 20 mins in a holding-pen area divided between priority and non-priority passengers. This was not fair on the elderly and inform. Far too much hand luggage was allowed on board. The cabin crew were not friendly nor proactive and their spoken English was poor. I overheard the lady siting directly in front of me ask for a non-meat croissant. She made this very clear. She paid her money and then had to call the flight attendant back as she was sold a meat filled croissant. The member of staff was very rude to the point of hostility. The captain gave minimal information about the flight. The landing was smooth and disembarkation orderly.
## 798 Frankfurt to Lisbon. Ryanair is a great airline. I have flown with many US airlines (JetBlue, Southwest) and they were great. But Ryanair is just great. This flight was about \342\202\25415! I went to Lisbon and came back about a few days after. The food was \342\202\2545 and it was a chicken breast sandwich, and it was actually good. A Pepsi was about \342\202\2542. We landed. It was a good landing too. And we parked at a gate and not at a stand which was great. Only thing is, no entertainment (I know it's a budget airline.)
## 799 Madrid to Marrakesh. The worst airline to fly on, completely unorganized customer service is horrible. They made me pay 55 euros because I didn\342\200\231t check in on time for my flight only for our flight to be delayed two extra hours. Definitely never fly with this airline again!
## 800 Frankfurt to Lisbon. Ryanair is a great airline. I have flown with many US airlines (Delta, American) and they were great. But Ryanair is just great. This flight was about 15 euros! I went to Lisbon and came back about a week ago. The food was 5 euros and it was a sandwich, and it was actually good. A Pepsi was about 2 euros. We landed. It was a good landing too. And we parked at a gate and not at a stand which was great. Only concern that happened is I waited about 1 hour and 20 mins to get to the plane. One delay because of rain in France, then the bus didn't start moving after 20 minutes! Then we stood in the bus right by the plane for 10 minutes. It was in the middle of nowhere but I highly recommend it.
## 801 Copenhagen to Dublin. Flight was delayed by about an hour but we knew this when we got to the Airport. I had checked in online before my outbound flight from Dublin so there was no hassle. A bit of a delay at Copenhagen Airport on the inbound flight as we were expected to print the luggage tag ourselves. A few staff floating about only to direct us to the kiosks but no help offered. It was another passenger who kindly showed me and I then assisted my colleague. Then the scan did not work when I tried to drop the bagage at the unmanned counter, only later on a staff member came to assist. A long walk to the boarding gate but I liked that as I felt that it was helping me to burn some calories, however this may not be welcomed by everyone (certainly if you can't walk long distances it may be necessary to request assistance). Service on board was slower than usual but cabin crew friendly and courteous. Ryanair has a good s\303\251lection of buy on board food and I had the fruitcake which was simply delicious and a lovely tea. On arrival my luggage arrived very promptly (much more efficient than priority and business class with some other airlines). Overall I was happy with Ryanair.
## 802 Eindhoven to Barcelona Reus. The worst airline I have flown with. It has been the 4th time I am using Ryanair and the 4th time the flight was delayed. Today I had a flight to Barcelona Reus and we were supposed to departure at 08.15, however because of flight delayed the departure is only at 14.10 which doesn\342\200\231t make any sense. I suggest to better spend a bit more money on more expensive airlines. Rynair just lost another customer.
## 803 Never flying Ryanair again, very worse customer care once you have a complaint! I was 9 hours in a queue after the flight where I should have traveled on Sunday, October 14 at 8:05 PM, with the destination to Porto being canceled without any explanation! I was from 20h from Sunday until 6am in the morning waiting for an alternative, which took 2 days, only arranged alternative flight on Tuesday evening, I've been waiting 2 days, lost 2 days of my work and time. There were 3 flights canceled at the same time, there were about 600 people in a queue with only 2 employees, a shame the service, they tried to dodge the hotel that we had right and transport to the same, they ended up giving but only 1 night, I arrived at hotel at 7am and had to check out at 11am, the next night had to be on my own! Estive 9 horas numa fila ap\303\263s o voo em que deveria ter viajado no domingo 14 de outubro pelas 20h05 com destino ao Porto ter sido cancelado sem qualquer explica\303\247\303\243o! Estive das 20h de domingo at\303\251 \303\240s 6h da madrugada \303\240 espera de uma alternativa, alternativa essa que demorou 2 dias, s\303\263 arranjaram voo alternativo na ter\303\247a-feira \303\240 noite, estive 2 dias \303\240 espera, perdi 2 dias do meu trabalho e tempo. Foram 3 voos cancelados \303\240 mesma hora, eram cerca de 600 pessoas numa fila com apenas 2 funcion\303\241rios, uma vergonha o atendimento, tentaram esquivar-se ao hotel que t\303\255nhamos direito e transporte para o mesmo, acabaram por ceder mas s\303\263 1 noite, cheguei ao hotel \303\240s 7h da manh\303\243 e tive que fazer check-out \303\240s 11h, na noite seguinte tive que ser por minha conta!
## 804 Santorini to Athens. I was told i had to pay an extra \342\202\25465/person to get a boarding pass on top of the \342\202\254146 flight tickets already paid per passenger. I did not understand why I was being asked to pay an additional 45% on top of the original flight. I asked to speak with the Ryanair manager at the Santorini check in desk, and explained to her that I do not have mobile data when traveling and could not check-in on-line and that the Ryanair confirmation I received via free Airport WiFi was in Greek. The agent proceeded to shout at me dismissing the fact that I do not have mobile data or that I do not speak Greek as \342\200\234not her problem\342\200\235, which I found rude and extremely poor customer service, especially at a manager level. I find this extra boarding pass fee as a predatory practice by Ryanair.
## 805 Budapest to Nuremberg. The worst airline ever, they charged me 60 euros to do check in at airport. If you are more than one person they give you seats at different places to force you to pay 7-15 euro to define your seats.
## 806 Barcelona to Cologne. I have never seen such a horrible airline before. At first you see that, the price of fly is unbelievable cheap. After booking or at the airport, you will be forced to pay around double due to their internal rules. On the other hand, the seats are horrible and you get null service either in airport or by the fly. Farther more, the staffs of the airline at the airport (in Barcelona) were very rude.
## 807 Bournemouth to Krakow. Ryanair cabin and ground crew are discriminatory over the baggage policy. On my flights outgoing/incoming I saw non-priority Polish travellers ripping off or covering up yellow tags on "hold" baggage whilst insisting that British travellers put their bags in the hold. Cabin crew ignored Polish women travellers who were abusing the weight limit on bags which did not fit under the seat in front and clearly were heavier than 10kg. Why have a policy at all if they are not prepared to enforce it.
## 808 Ancona to Stansted. We got delayed and sat on the plane for 2.55hrs. No refreshments have been offered or any form of compensation. The seats are uncomfortable. They charge you for everything, they\342\200\231d probably charge you to go to the toilet. Their fees are extortionate and exagerated. Entertainment on the plane? Forget about it. Not even a monitor in the middle of aisle to view the GPS. Be careful on their website, before you actually pay for your ticket, they try to sell you extra things, make sure you select \342\200\234no thanks\342\200\235 if they are not for you. If you buy 2 tickets at the same time, you dont get seats together, you have to pay extra for that. The only way we\342\200\231ll be using this company again is if there is absolutely no other flight available, i\342\200\231d rather pay a little extra for a better service and a more comfortable flight.
## 809 Amsterdam to Malaga. Rubbish airline, it's enough that they charge you extra for a piece of luggage. But they charge an extra 55 euros if you check in at the airport (less than 2 hours in advance). Will be flying with airlines that represent the real costs from now on.
## 810 Athens to Santorini. Terrible experience ever with Ryanair. Not only they charged me for every single useless services, they were very rude and obnoxious. It all started at the check in counter. They refused to answer questions directly and they were not professional on handling baggage at all. They almost damaged my luggage right in front of me. Even though I paid for every piece of luggage a head of time, at the counter they charged me 49:00\342\202\254 for the luggage I checked in. To pay that charge she sent me to another counter pointing to a row of counters, refusing to provide information as why I am going there and Ordered me "go there!". Here this, on that counter which I don't know the name, they said we don't know why she didn't explain and they referred me back to her, but before they sent me away and charged me 68.00\342\202\254 for not checking in ahead. Again rudely they said; "DON'T YOU READ YOUR EMAIL?! WE SENT AN EMAIL THAT IF YOU DON'T CHECK IN AHEAD OF TIME WE WILL CHARGE YOU." It was too close to my departure so I had to run, but at the gate when I checked that reminder, there was no mention of the extra fee for check in.
## 811 I tried checking in to their website days before the flight but it does not give me my boarding pass but it says checked in, when I arrived at the airport I tried to check in online but it won\342\200\231t let me. They said I can\342\200\231t check in online now because it\342\200\231s too late even though the flight is not until 3 hours time, therefore I Paid extra to get the boarding pass and the customer service was useless. Can\342\200\231t believe how ripoff this airlines are, and how stupid their system is. I wouldn\342\200\231t recommend this airline to anyone.
## 812 Dublin to Bologna from Dublin. Outward departure on time and in-service v good with nice polite staff. Return very prompt and efficient and another on time departure. Again staff very polite, polished and smiling. Bottle of white wine 6 euro and passable. FR flight times are much more palatable than a 5.45 am departure with EI, its a shame they dont fly over the Winter period. Since it is not Nov 1st the old baggage rules applied but I saw a couple ripping off their yellow tags as they got on the plane and putting them inside the cabin which is not really fair play. All in all a good quality product that got me from A to B.
## 813 Athens to Thessaloniki. Ryanair operations have moved to the satellite terminal of Athens airport, which is a far walk, however it makes boarding a much better experience, as there is more space and it is done by walking to the planes instead of using buses. Flight on time, arrival ahead of schedule, even if it was on of the last flights of the day, about 80% full. Very cheap ticket (15\342\202\254), although someone needs to be careful, as this airline attempts to add a lot of costs to the client - one needs to keep that in mind when purchasing a fare. Staff was friendly and smiling. Only thing I can fault the airline was that they kept the sign to have the belt on, for the whole duration of this short flight (40'), which was uncomfortable. There was no turbulence or bad weather, so I suspect it was to facilitate the procedures. Otherwise a pretty good basic flight.
## 814 On Monday 17/9/2018 evening flight from Rome to Dublin. While the seats are very cramped and not supportive of good back, neck or leg posture the cabin crew that evening made up for the discomfort, the young staff particularly nice and attentive, one young man especially, Italian I think.
## 815 Dublin to Gatwick. Absolutely horrendous customer service at the airport. We booked through kiwi.com, and had a connection in Dublin. However the first leg of the flight was late due (of course), and we didnt have nearly enough time to get to our second flight. The security line at Dublin airport was extremely long, so we asked the Ryanair desk for help. The woman behind the counter was incredibly rude, and just looked at me and said run. She would not help us get through security. So we had to beg people in line and sprint to the gate. The only reason we made the flight was because it was also late. It was a terrible panic. The Ryanair staff in Dublin airport were incredibly rude and dismissive.
## 816 Rome to Barcelona. I flew a round trip with Ryanair recently in September 2018. The first trip was not very good, it was Rome to Barcelona taking off at midnight. The flight was delayed 1.5 hours and by the time I got there public transportation was finished and I had to pay for a taxi to my hotel. Also all throughout the flight, the most annoying part were the flight attendants. Nobody else was talking except for them, chatting with each other the entire time about their boyfriends. Very unprofessional. The second time coming back was actually very good. The flight was schedule to depart at 6:30am and it boarded and left and arrived exactly on time. The flight attendants were fine and professional. I guess the key is to choose the first Ryanair flight that leaves first thing in the morning. That way their airplanes are already on the ground and finished their maintenance checks. Their schedules are so packed that if one flight gets delayed during the day, it creates a domino effect that delays every subsequent flight. In conclusion, pretty good value. I had an overall okay experience. Just remember that they will probably be delayed and to make sure that you compensate for this delay for your arrival destination. Make sure you know how to get to your hotel cheaply if it gets super delayed. I would fly again. Oh and don't forget to online check in and print your boarding pass and pay for any check luggage ahead of time.
## 817 Dublin to Stansted. I have an Indian passport and am obliged to get my visa checked at the check in counter. I went to the check in counter and presented my ticket and UK visa. They stamped my ticket after verifying the UK visa, I went to security and the barcode won't work as the stamp was on bar code. I was hoping that she knew where to stamp it, I went to the counter again and they issue me a boarding card. While boarding I was asked to show my visa again and I told them I have already checked in at the counter and the ticked is stamped that the visa have been checked. The boarding personnel threatened that I won't be able to board the fligh . The staff was totally rude.
## 818 Paris to Rome. Plane departed 30 minutes late, for the second time in a row. We showed up the day before for our checked tickets 5 minutes late. As of today the people are 40 minutes late boarding. Beauvais is not a Paris airport. The drive time outside of Paris is two hours. It's 130 euro fare. That cost as much as the tickets to Italy. The fares may be cheaper, but the service nor the true cost are. Best of all, I paid for priority seating for my boyfriend, he boarded after me. Never fly them. First and most be honest, the airport you serve for Paris is 80km away.
## 819 Flight was 25 minutes delayed take-off but kept informed by Captain and made up time to land only 5 minutes late on new (February 2018) aircraft with seats comfortable for the 3 hour trip. I had special assistance which worked well (as always at Faro) and on entering mentioned to the cabin assistant that, following illness, it was our first holiday for 2 years and could we have some 'bubbly' to celebrate - immediately the seat belt sign was switched off 2 bottles of Prosecco were handed to us - a nice touch! For the first time ever I decided to try Ryanair food and was pleasantly surprised - the lasagne was tasty, of decent proportion, and at \342\202\25415 for this plus a bottle of wine, fruit cake and coffee not bad value. The crew were smart and cheerful and helped us with our luggage at both ends. Of all the L.C.C. Ryanair are our favourite - always offering what they say and at the lowest cost. I note most of the complaints are where people have failed to read the regulations before flying!
## 820 Seville to Stansted. Never Ryanair. Just don't do it. Delay for more than 3 hours with zero communication to customer. Ground generator broke down and no air conditioning on the ground when temperature outside about 90F. Air steward refused to provide drinking water on demand. No meaningful compensation.
## 821 Sofia to Madrid. We have all gotten used to low cost airlines and all that comes with it. We also appreciate the availability of cheaper tickets (not always and not that cheap in a lot of cases!!). However, it is a bit much when corporate greed consistently comes up with ridiculous ideas on how to charge more money. Case in point: seat selection! I am not asking for a seat of my choice - however, we are a family of four (two kids included) - is it too much to ask to have seats together as a family rather than being asked to pay extra for it? Shameful behaviour! Lastly - why on earth don't the seats recline? It's a 3.5 hour or flight and it's not as if they are serving a sumptuous meal that might be affected.
## 822 Athens to Heraklion. The most horrible and expensive low cost airlines I\342\200\231ve ever flown. Wouldn\342\200\231t recommend to anyone! They charge for printing ticket and bag almost 120 euro plus 40 euro ticket. Service is horrible as well.
## 823 Corfu to Stansted. I feel Ryanair has lost it's appeal over the past year or so. On this recent return trip to Corfu, flights are generally delayed to some extent. Previously we always found Ryanair to be very efficient in terms of keeping to departure times. However, boarding process and splitting people up has caused chaos on board. I can understand the theory behind thir policy, and personally, for an extra couple of \342\202\254 I would reserve seat together. But a lot of people still take pot luck, get seats allocated apart and then try throughout the boarding process, taxi, after take off to persuade others to change seats in order that they can sit together. Middle seats being allocated in premium seating (extra leg room, front seats that others pay \342\202\25415 for). Their boarding process needs to be more streamlined as well, example, boarding at Corfu for Priority, no signs etc. to indicate where to queue. Got through gate, only to be held outside, busses arrived, but for some reason we were not allowed on them for 10 minutes, then a free for all with non-priority and priority getting on buses together. In reality, if another airline is similar in price I would chose them now over Ryanair as the whole travel process has become more chaotic, which is a shame, as with a few improvements and a bit better organisation not costing any money, it could be a far better experience.
## 824 So, where do I start! It was one of the most idiotic degrading experience of my life! Booked a ticked with boarding priority, plus luggage in the cabin! The priority was only in terms of checking our boarding passes in the airport, nothing more! On the busses from the airport to the aircraft it was mixed, no boarding priority whatsoever! Complete waste of money! In the aircraft, it was, hmmmm ok, first of all it was dirty, in the seats crumbs and spilled coke! The aircraft was smelly and it was the dirtiest thing I have ever seen! When I asked the steward if he could clean it up he told me that I should of take a seat first and then he would come to clean it up. That was the first and last time with Ryanair. P.S with just 14\342\202\254 more I could of taken a flight with Aegean, with free meal, drinks, seat choice and clean plane/pleasant staff!
## 825 Malaga to Dublin. While I understand that Ryanair is a low cost airline I find their tactics for squeezing extra money out of you distasteful. Everything is extra. For example if you would like to sit with your partner you need to pay for that privilege otherwise you'll be seated randomly. At the airport you will be treated like cattle. We were boarded for our flight and then left standing on a ramp in Malaga airport for 30 minutes while they cleaned the aircraft. The seats are uncomfortable and the service is lacking. The fact that half of their employees are currently striking for better conditions shows how badly they are treated. This translates into employees who really don't care what happens. I will avoid flying Ryanair in future even if it costs me more money.
## 826 Stansted to Eindhoven. Instead of checking in online and not be able to print my own boarding pass I thought to check in at the airport. I was there 1 hour and 55 minutes before flight departure. Instead of just helping me, they charged me 55 pounds (75 euros) to print my boarding pass. This money is not going towards some charity or emission compensation but straight in the pocket of the company. And I know that strictly I wasn't on time and rules are there for a reason, but this fee is really out of proportion!
## 827 Lisbon to Ponta Delgada. I find it absolutely disgusting of Ryanair to not let sit couples together without extra charge but instead choose random seats apart so that they are forced to pay for having the "privilege" to sit next to each other. My wife is afraid of flying, well done Ryanair squeezing out some extra bucks.
## 828 I had a very unpleasant experience travelling with Ryanair from East Midlands to Warsaw Modlin. I had one small luggage (suitcase) with me. My ticket informed me of the luggage size regulations that my suitscase followed and also ticket said that I\342\200\231m allowed to take one small luggage into the cabin. The gate lady came up to me and put a yellow band around my suitcase and it then went inside with the other luggage. After Landing at Modlin airport my suitcase came out with a broken lock and a broken zip, on top of that next the zip stitches holding the suitcase together were broken - it look like somebody was trying to get into the suitcase. I\342\200\231m not impressed with the service.
## 829 Booked Frankfurt to Corfuusing the \342\200\234Flexi Plus\342\200\235 option given I was connecting from overseas with a long haul flight with plenty of luggage. At the time of the purchase, the information page was indicating that the 20Kg baggage was indeed included. When I tried to check in at Frankfurt airport on 11/09/210 I was extremely surprised that I was asked to pay 50 Euros for the 20Kg allowance - the employees were referring to an ambiguous police change - which I cannot locate on your website. What I was able to find is that Ryanair removed the 20Kg allowance from the \342\200\234Flexi Plus\342\200\235 however they still provide it for the \342\200\234Plus\342\200\235. However, at the time of my booking \342\200\234Flexi Plus\342\200\235 was also eligible for 20Kg.
## 830 Stansted to Shannon. Very efficient flight. Despite the late take-off flight arrived on time. Cabin crew was very friendly, cheerful and in good humour which certainly made for a nice ambiance. The buy on board service was good, I had a lovely chocolate and cranberry cake with tea for 5 euros. Overall I was very pleased with this flight but I wish they had the lovely Ryanair cabin crew tie for sale!
## 831 737 is uncomfortable and narrow plane to fly, with Ryanair's legroom a 2hr 20min flight was all I could handle. Cabin uncomfortably hot then cold. Smooth journey, cabin crew pleasant and rude, food and drink prices are absolutely ridiculous compared to other low cost airlines. Always try to avoid whenever possible. For what I've paid the price doesn't reflect for the seat quality and food drink prices. Would recommend only at the lowest price.
## 832 Athens to Berlin on 7th September. Das ganze Personal war unfreundlich, da fliegt man wirklich "gerne" in den Urlaub. Dies ist meine letzte Reise mit Ryanair und ich m\303\266chte jeden warnen, der daran denkt mit Ryanair zu fliegen. The whole staff was unfriendly , as you really "like to fly" on vacation. This is my last trip with Ryanair and I would like to warn everyone who is thinking of flying with Ryanair.
## 833 I booked a around trip from Barcelona to Malaga. This was a connection flight. We flew from New York to Barcelona via AA and then Barcelona to Malaga via Ryanair. I was going to my sister's wedding and almost missed the wedding because of Ryanair. Terrible service. Staff is rude and don't care about customers. I had to wait more than 2 hours on a line to just print out my boarding pass. I asked the agent to speed up the process because I would miss my flight and received a very rude answer that she did not care if I would miss my flight. They did not have enough people to take of the customers. Additionally, I was charged 60 euros just to print out the boarding pass. Their app does not work properly and I lost a long time trying to print out my boarding pass on the app.
## 834 I am flying again with them from Stansted to Rome but their website didn\342\200\231t let me check in online and in the airport they charged me \342\202\25455 to check in. Then the flight is delayed. This is my last travel with Ryanair and I would like to warn anyone who\342\200\231s thinking of flying with Ryan air, you will be wasting your money, time and add extra stress to your life better pay a bit more with a different airline and have a pleasant journey.
## 835 Stansted to Brindisi. Another shameful, stressful flight by Ryanair. What's the point of getting into the airport on time if the flights are always delayed? But as always, no staff mentioned anything about it, we were queuing up for hours, and I arrived at the destination 3 hours later. Thank god I haven't got any more flights booked with Ryanair. Never again.
## 836 Milan to Sofia. Me and my 83 old mother were early at the check-in counter. All three employees were really slow with the check-in procedure of passengers. One of them left one hour before the flight, another one was speaking 20 minutes on the phone while passengers were waiting. We were the last ones to be served, the luggage label was available but the system shut down and we were the only ones not to be allowed to enter the plane. We had to pay 100 euros each for new tickets. Will not fly with Ryanair again, even if the tickets are for free.
## 837 Santiago de Compostela to Barcelona. This flight was cancelled, only alternative given to us was to fly 4 days later on the first flight from the company with the same route and with seats. As this was not an option, we asked for refund and bought flights for the next days with other company. Of course the price of these flights were astronomical but we had no alternative as we could not stay four days without flying back home. We put a claim on their site to ask for compensation for cancellation and the refund of the difference between their flight and the new flight we had bought. The answer is: not reimbursing the new flight as we opted for reimbursement of our tickets, and no compensation since the flight was 'cancelled unexpectedly'. This must be the most ridiculous motive to not compensate for cancellation. Other than that: Ground service obviously did not do their job as they did not offer an alternative route (except four days later) and should have offered a place to stay for the night (it was 23.30 when we left the airport). Value for money in this case is terrible: we were refund but somehow lost 10\342\202\254 between paid and refund, had to buy new tickets from our own pocket at expensive rate. For other times I flew with the company I remember seat being just OK but colour scheme in the aircraft is just terrible to my eyes, blue and yellow plastic.
## 838 Bratislava to Gerona. I am a family traveller, so being split out around the aircraft as non-priority is, for me, pretty poor. But I must admit, this is the only thing I didn't like about Ryanair. The crew was amazing. Food was great. Hot and fresh. A bit expensive, but fresh. Seat was, for this short kind of a flight, good. A thing that dissapointed me a bit is the fact that there isn't any storage in the seat in front of you, so I had to hold the men\303\274 for the whole flight. We flew FR9027, a 2:00 h flight. Thing that I like about Ryanair is that they use pre - installed airstairs in the front of the aircraft. I had 11A seat, so I was sitting next to the missing window seat. Overall, love it. Really nice airline.
## 839 Aside from the poor value for money once all the additional extras like hand luggage had been taken into account, the whole experience with Ryanair (our first and last) was pretty poor. Despite there only being one scheduled flight that day between Stansted and Kefalonia, we were delayed both ways. Outbound by 2.5 hours and 2 hours coming home! Outbound flight: Kept waiting between the gate and the aircraft for 45 minutes in the heat No running water on the aircraft itself! No offer or concession for the above, then ignored by the cabin crew when they eventually served some refreshments, only to be told that we must have somehow missed the member of staff who was serving. I pointed out that she had gone straight past our section of the plane and hadn't asked anyone including ourselves if we actually wanted anything to drink. They even argued the fact that this had happened, which was quite unbelievable. But clearly they had understocked the refreshments and had decided to miss the rear section of the plane to try and account for this. Shocking lack of politeness and customer service. Will never fly Ryanair again due to their complete disregard for its passengers and their in-flight comfort and experience. Just a complete rip off and an awful airline.
## 840 The phrase 'you get what you pay for' broadly springs to mind however, you do actually "pay" in all senses. Cheap flights bonus, pay more for selected seat to sit near family ok however easyJet will try to get you close anyway, more to get on priority understandable, \302\24345 fee if your app doesn't work and you don't have a paper copy of your boarding pass. Flight itself chaotic. No one takes bags at the gate that are meant to go in hold for free resulting in everyone trying to get cabin bags on then moaning when there is no space. They pack you in, close the doors then tell you there's a delay, passengers sat making phone calls, messaging, texting at every possible opportunity throughout the flight but that's ok. They keep every possible bright light on during the entire flight (we flew overnight) so no chance of sleeping in their slimline chairs that even I struggled to get my legs comfy in and I'm only 5'6". Then they decide to put seat belt signs on, for no apparent reason before turning them back off and bringing the trolleys out. So no one can actually go to the loo because of the trolleys and the 2 staff taking up the entire aisle! Seriously, would it not be easier to do this with the belt lights on? Return flight meant to take off at 22.30 so all lined up with gates open at 2200, but with no warning, no information given were left standing around to board just after 2240. Queues chaotic, people in priority that shouldn't be but let on anyway so everyone else left with backs and legs aching, kids crying and tired because the staff don't seem to know what they are doing. Followed by yet again a late night flight that's lit up like Blackpool tower with everyone doing as they please. Can safely say there is probably less torture endured by stowaways! We will personally never use Ryanair again and would recommend every company but them.
## 841 Ibiza to Liverpool. Worst airline I have ever been on. Staff are bad, some foreign staff barely speak English so you cannot understand much they are saying when calling over the loud speaker, the plane was filthy. Purposely put a party of people away from each other so that you have to pay the \302\24315 per person per flight charge to select your seats. Our last trip they did this and the plane was only 3/4 full, thankfully we never paid this charge an could change seats. I do not see how they are allowed to carry on pulling tricks like this. If these are the methods they resort to to operate and scam customers then the sooner they are out of business, the better. I would recommend any airline over this.
## 842 Dortmund to Stansted. What most people also dont seem to get: with Ryanair you get what you pay for. With other more expensive airlines you pay for the flight and baggage and comfort and food etc all at once. With Ryanair you first of all pay for the flight, nothing more. IDK what people expect for 15\342\202\254 besides the flight? Every bit of comfort will cost you but I think this is just reasonable. People have to start using their brains instead of just expecting everything they get in Emirates First class on a 15\342\202\254 flight. My two flights (Dortmund-Stansted/Stansted-Dortmund) were fast, cheap and great. I paid for a flight, I got a flight, nothing more, nothing less. Seats were fairly comfortable, Legroom was okay. Second flight was delayed by about 35mins but I don't know who\302\264s fault it was. Everyone was trying their best to get this flight boarded and up in the air as quick as possible. I am compleatly satisfied and happy and I\302\264ll definitely fly Ryanair again. You\302\264ll be satisfied too when you don't expect more than you pay for.
## 843 Thessaloniki to Budapest. Pretty solid product for what you are paying for. Leg room is ok, and although the seat does not recline you have enough legroom to stretch your legs (I'm 6ft tall). Cabin crew is mostly young, friendly and smiley. I do fly with Ryanair on the frequent basis and delays are not that usual, if you don't mind sitting apart and not having your carry-on with you on board (with no extra paying) this airline is fine for you.
## 844 Bremen to Palma de Mallorca. Very lucky that I wasn't afflicted by the strike, which left thousands of vacationers unhappy. Conditions at this airlin are probably really bad, but it is something I don't experience as customer. The flight was excellent, fantastic value for money and staff were helpful, funny and attentive. Yes, you pay for a coffee (but I really like the taste) and snacks, but I got used to it and do enjoy flights with Ryanair now. Flight was just a little late, short enough to relax and rest before a nice vacation break.
## 845 Early flight from Athens to Rome on Ryanair, departing at 06:55. Baggage drop off went ok. Going through security was fine as well. Boarding at Athens was on time as well as departure. There was commotion at the gate, as two more Ryanair flights to Rhodes and Paphos were departing almost at the same time and there was not enough seating. Boarded the plane by taking a bus and then going up the stairs - not very pleasant if you have a carry on!. Staff on board were pleasant, and tried to sell their on-board products. There was some turbulence on the flight. The leg space on Ryanair B737 is not as much as on other B737s, but overall for a short flight was ok. The pilot landed the aircraft very smoothly at the small Ciampino airport.
## 846 Warsaw to Barcelona. My experience with Ryanair was the worst ever. A week before my flight I found tons of flights being cancelled and I had to change my plans. Their tickets maybe on the cheaper side but in reality you pay for every single thing. We had to pay 50\342\202\254 to check-in a single luggage because even that wasn't included in the ticket, in addition there was no meal on the flight you had to pay for one. Our flight also got delayed by 1 hour. Overall it was a horrible experience and I wouldn't recommend it to anyone ever.
## 847 Stansted to Oslo. Ryanair tried hard to improve it brand perception but they have gone downhill again. We flew from Stansted airport where Ryanair pushed all their customers to queue in one line for self serving machine. Chaos, people cutting through the queue and super agresive staff was our experience. With two small children we had to wait for over an hour to get out luggage checked in. There is no longer priority if you travel with children. Instead you have to pay for it.
## 848 Bristol to Cologne. Leaving us waiting at the airport 5 hours. What\342\200\231s more they then say the flight is cancelled. Luckily I live in England. The people who live in Germany are stranded with no flights for another two days. Ryanair have no idea how to run an airline. At least easyjet eventually get people where they need need to be and don\342\200\231t leave them stuck.
## 849 Naples to Stansted. My girlfriend\342\200\231s flight sat on the flight line for 4 hours. All passengers on board. Repeatedly being told that they would be taking off in 15 minutes. She had a three hour layover planned at her next airport but instead her plane landed almost two hours after the next plane took off. It has been over a week on us calling Ryanair, online chatting, messaging through Facebook and filling out forms that can\342\200\231t actually be filled out and we have not made an inch of progress. Most phone numbers we are given don\342\200\231t connect to anybody at Ryanair or they put you on hold for an hour then disconnect. This has been an absolute waste of my time and I will recommend to avoid Ryanair at all costs.
## 850 Cologne to Berlin-Schonefeld. Amazingly my flight at 6:45 a.m. was on time - in spite of an industrial action one day before. Only one passenger got into trouble with an assistant, standing in the priority queue. His second piece of hand luggage was terribly oversized. That's just and reasonable. By the way, if Ryanair payed his staff fair, we would experience more kind personnel. Later I looked at the following flights of this aircraft using the registration prefixes: EI-DLW. Almost any other flight of that day was delayed - usually more than one hour. Happily my flight was on time - by accident?
## 851 Stansted to Athens. Never fly with Ryanair. After waiting inside an aircraft for 5 hours our flight was cancelled and the airline refuses to compensate us for spending the night at the airport without any support or customer service and for staying another 4 days in London. No refreshments or food was given. No instructions or guidance. They said it was due to bad weather conditions, although other airlines were operating.
## 852 Berlin to Glasgow. New Boeing 737-800 with the updated "Sky" interior, larger overhead bins and thinner seats, which I find more comfortable than the older ones, with a little bit more legroom. Schoenefeld Airport was quieter than I had seen it, but the usual crush at the inadequately-designed followed, although boarding staff kept good control of the boarding process. Aircraft arrived early, but I could see through the window that offloading from the previous flight was taking a long time, with only one person wearing a "Swissport Duty Station Manager" hi viz vest directing the passengers on his own until more staff turned up and put in rear stairs and started offloading luggage. This caused a delay on departure, and the Captain apologised for the heat in the cabin, which was caused by a "lack of air conditioning power units" at the airport, but I could see when we were departing the aircraft needed an air start unit, so obviously there was an issue with the aircraft's ground power. This resulted in a total delay of around 30 minutes, but at least the cabin cooled down during taxi to the runway. The crew were friendly, they did their jobs efficiently and although they were a mix of nationalities, the tannoy announcements in English were very clear by the 3 different crew members who made them (something that admittedly is not always the case on Ryanair flights). Two rounds of drinks and refreshments were served and one duty free trolley run performed with an announcement about special offers etc. No inflight magazines were given out on this flight, which I don't mind as I was not planning to buy anything, but may have stopped other people from purchasing items. We landed 15 minutes late in Glasgow and rear stairs were positioned quickly on the aircraft for quick disembarking. With the exception of the unpleasant airport in Berlin this was a quick and comfortable flight. Value for money not as good as it is in the winter, but I understand that August is peak season. I have no issues with Ryanair flying on this route, regardless of the supposed horror stories of other people.
## 853 Traveling with Ryanair has been an absolute nightmare. In a nutshell: I was travelling from Budapest to London Stansted. The flight had more than 2 hours delay when leaving Budapest. When we arrived in London at late night we had to wait almost 30 minutes to get out of the plane, since no bus was available to pick us up. After other 30 minutes queuing at passport control, we had to wait almost one hour for the luggage before we were informed that it could take few hours to be delivered, since there were no worker available (apparently they were on holidays or on strike). There were many passengers from other flights in the same condition. There was only a Ryanair representative, clearly overwhelmed and unable to deal with the situation. He finally provided us with a number to call the day after to have more information about our luggage. He did not tell us to file any report nor he provided us with any written information. When I left the airport it was 3am and no trace of my bag. The day after I tried to call that number maybe 20-30 times and none never picked up the phone. I had several chats with Ryanair representatives on the Ryanair website and I was just told to call the same number which doesn\342\200\231t work or where nobody picks up the calls. I was told further by Ryanair representatives on the chat that when I call that number they will be able to fill with me a missing luggage report, because without it nobody can do anything. As I said before, the Ryanair representative at the airport did not mention that we had to file such a report, but he just provided us with the mentioned number to call. I have also filed several reports and complaints via Ryanair website by using different forms, nobody came back to me with any response. If I wanted to file a query with Ryanair Baggage Claim Form, I could not do it, without the missing luggage report number. Ryanair didn\342\200\231t provide any different number where I could speak to someone who could effectively provide for help. I was finally advised to go to the airport to look for my luggage personally, since they could not do anything to help me. When I asked if I was going to be reimbursed for the travel expenses and for the time spent to go the airport, Ryanair representatives said that it was unlikely. Today still no trace of my luggage, I have received no answer to my emails and complaints, and the famous number is still not working. I will clearly avoid Ryanair in the future and I would suggest anyone to do the same.
## 854 My experience wasn't horrible as everyone says. I've not had a single issue. On my flight from BTS to STN at 6:30 in the morning everything was excellent with the airline. It was on time, staff were nice and friendly. The only issue I've had during the boarding process was because of Bratislava airport staff but that has nothing to do with Ryanair. I have one complaint but I do understand it. Checking in we got our seats seperated, but with the ticket price Ryanair sells, it's still cheap even after buying Selected seats. The food on board was cold, but when I asked the crew to heat it some more they kindly offered to do so. After landing the process was quick, but due to some issues at Stansted (which I learned happens often) we waited over an hour for our luggage. Having arrived soon in the morning and not having had any coach/train reservation for a specific time, this wasn't an issue for me. On my way back I would have things to complain about, but I'm not sure how much of it is Ryanair's fault. The airport was crowded, we waited a long time to depart or even board, apparently because checked in luggage hadn't arrived to the plane yet. We had out gate announced on time and having a 1 hour delay isn't too bad considering it's an evening flight by a budget company. The crew were again nice even though they had a whole day of work behind them. I wouldn't complain about the seats and comfort. Of course it wasn't perfect, but it wasn't uncomfortable and I would definitely fly Ryanair again. The value for money with this airline was perfect for me.
## 855 Stansted to Toulouse. Awful. Flights were delayed by 1 hour leaving England, the food on board is overpriced and bland, the drinks are tiny and expensive and the plane is so loud. Overall not so bad, but our return has been delayed by 5.5 hours so far and we are still waiting. No information, no Ryanair staff on hand and no help whatsoever from Ryanair. Completely abandoned and they won't let us out of the airport without first taking a refund for the flight, which doesn't help me as if need to pay more to fly another day or with another line. This will be the last time I fly with them, I won't even recount the time my Ryanair flight from Hungary nearly ended in an emergency landing and was then denied by Ryanair.
## 856 Rome to Comiso. We were booked since March. We got to Rome June 6 and we were scheduled to go to Sicily via Comiso on June 8. On June 6 at 10 in the evening we received a message that flight was cancelled. No explanation. So obviously we panicked and had to rebook right there and then which cost us way more. They offered a refund. So i filled up the refund application. That was June, its August and they haven't refunded us. They make it impossible for you to contact them! They keep claiming they have refunded us but we never got this. This airline charges so little but don't be fooled they are rude and have not refunded us!!
## 857 Bucharest to Stansted. I'm only giving 1 star as 0 star isn't an option. They are by far the worst company I have ever had to deal with, light years behind any other organisation in terms of good customer relations. If everything goes smoothly you may get a bargain flight but when things go wrong, (12 hour delay) they go catastrophically wrong. Ryanair have zero customer support at the airport or via the phone. They leave their passengers without food or explanation of the cause of the delay. They admit fault after multiple phone calls and emails and accept they are liable for compensation under EU261 guidelines. They then use every possible delay tactic and lie there way through every email and web chat conversation for months in the hope that the customer will give up asking for their refund. I have been waiting five months for a refund and have now had to pay out of my own pocket to take Ryanair to a small claims court. I suspect they will ignore these demands and carry on taking peoples money and ignoring any requests for customer service. I urge anyone thinking about purchasing a flight through this joke of a company to just take 1 minute to search for any review site online and see how bad they really are before you part with your money. I would have happily paid double the original ticket price to avoid having to deal with these criminals.
## 858 Our flight from Stansted to Pardubice on 28th July was cancelled 2 hours before its planned departure, no one was taking calls and the web chat support parody was disconnecting. Ryanair have not sent a single email or SMS message to us. We have tried to contact one of their resellers and even them confirmed that it is impossible to contact you because when the call reaches end of your support hours it hangs (no comment).
## 859 Stansted to Milan Bergamo. While the crew was very nice, everything else was terrible, the flight bording was about 45 minutes late (which having been traveling for a while I didn't give much attention to) but after waiting another 30 minutes on the stairwell to get on the tarmac (the temperature was about 30C). After boarding the plane the real agony began, the plane was supposed to leave Stansted quickly (20:05 local time) but we kept being told that the flight would be delayed and so about 20 minutes after we were supposed to land at Milan (23:05 local time) we started to move and finally we departed. We landed at 1 am local time. I can assure anyone reading this that I will not be using Ryanair again, by trying to save some money I wasted a huge amount of time.
## 860 Athens to Bratislava. The flight was more than an hour delayed, and no one gave an information, only just before the departure. We arrived at 20:20, although the flight arrival should have been 19:15. My final destination was Vienna, so i have booked an inclusive plus airport line ticket from the Ryanair site. We departed at 21:20 with the bus, the driver could not speak English, he accused me of a heavy luggage and asked for money (although it was not asked from me to put it inside the bus), and it is now 22:24, I am still sitting in the bus because the driver stopped for coffee in a gas station, letting us wait in the bus for more than 15 minutes! I should have been home from 8 o clock according to the 30-40 minutes that Ryanair suggests for the driving distance! I will never fly to Bratislava again, and as clear as that, never with Ryanair.
## 861 Bucharest to Rome. I am truly disappointed in the service from this flight. There was a delay of almost 1 hour without any notice, not even on the app or at the gate. Every employee was saying is leaving in time, but that was not true. I wasn\342\200\231t told any information, moreover I was lied to my face and then no reason was given for the delay.
## 862 Rome to Stansted. I have been flying with Ryanair for 7 years, and the last 2 were a nightmare. There is no chance of reaching your destination on time, every single plane bears at least an 1-1.5 hours delay, if not more, but always less than 3 hours to avoid giving compensation. Even when completely wrong they will not allow any flexibility like allowing silence during your flight or boarding your luggage. Even after waiting 2.5 h in the airport plus waiting time on the plane (they seem to be never getting a slot to leave) they will try to sell their junk and shout on their microphones. Disgusting. I will do anything possible to avoid Ryanair.
## 863 Cologne to Berlin. Probably the worst airline in europe. Out of my last 4 flights with them 1 was canceled, 1 was delayed by 40min, 2 by more than 1.5hours. There is absolutely no service at all from ground staff, they are more occupied with checking the luggage sizes. After my flight got canceled, there was no free of charge hotline available. There was no offering of compensation as part of the EU flight regulations. The seats are super uncomfortable. I am 1.9m and it really is a pain getting in and sitting there for more than 10min. There is no wifi and during the flight I am bombarded with offers of lottery tickets. I am always trying to avoid them as much as possible. Unfortunately there are legs only served by Ryanair that I need to fly from time to time.
## 864 Stansted to Cologne. I usually try to avoid flying with Ryanair due to usual delays and unexpected cancellation. This time I had to take an early flight and the airport close to my home just offer early Ryanair flights. I should have known better. They gave a really short notice of cancellation and the service was poor. I really wish that they get bankrupt and leave this earth forever. Unfortunately people keep booking the most unreliable airline because it\342\200\231s cheap. In the end I lost more money than I saved. Avoid avoid. Never ever again.
## 865 Both flights from Stansted to Toulouse and back were delayed by around two hours. Furthermore my bag was wrecked by ground staff and when I complained at the baggage desk, I was meant to have been given a reference number to claim (I did not know this at the time). Instead I was just told how to complain. Ryanair are refusing to reimburse me for the wrecked bag because staff failed to follow due process and give me a reference number. Absolutely useless customer service.
## 866 Ibiza to Liverpool. Worst airline I've ever been with, the staff on the flight weren't too bad but there was delays left right and centre and the time management was awful. We planned to get home for 4.30pm and only ended up getting home at 1.00am. We had to do an emergency landing in Barcelona and they would not tell us why, this delayed us for a good 4 hours and then all they did was provide us with 5 euro coupon to spend on food in the airport (what can you buy from the airport with 5 euros?) and then to make everything worse they boarded us on to the flight at least 1 hour and 30 minutes before the flight even moved. Worst airline I've ever been with!
## 867 A nice flight out and return to Pisa. Staff very nice and regular updates from flight deck. On time outwards but delayed due to air traffic control on homeward journey. I'm a regular flyer with Ryanair and their fares suit my budget. I don't take on any on board luggage as I'm happy to give my case over at the other end. I just dont see the point of the priority boarding as we are all going in the one direction. We also bring our own food and drink. There are plenty of water filling points in Dubin airport. Since I was travelling with 3 children, a seat was allocated but I think FR need to rethink the seating algorithms for. This was an efficient and value for money flight.
## 868 Thessaloniki to Stansted. Delayed flight by an hour, no explanation and the plane is filthy, this was a repeat of the incoming flight, which was again delayed with no explanation. Given the strike action going on with this airline I should be grateful seeing some poor people waiting to reschedule their cancelled airline. This is the second return flight I\342\200\231ve taken with Ryanair and given their continued bad reputation, I\342\200\231ll never fly them again.
## 869 Travelled from Rome to Athens on Friday night and the flight was cancelled. It was a a disgrace, I lost my connection so I had to book with another airline to reach Singapore, trapped in a hotel far from the city without dinner and zero official explanations.
## 870 Paphos to Stansted. I recently experienced a delay of almost 3 hours due to air traffic reasons and possibly due to a technical problem.Then, because of this delay, Swissport, who deals with the luggage, delayed in processing the luggage for reclaim. Total delay 3 hours and 40 minutes minimum. I received text messages during the delay period as well as Email, stating about the next steps, so that was really helpful. There was a bit of a chaos at the baggage reclaim desk, with people asking when their luggage will appear and also the luggage from a previous day flight piled in front of the desk, ready to be dealt with by Ryanair. The company was happy to compensate for all this trouble so I really appreciated it. OK, given the fact that there were many strikes and traffic in Europe, I expected this kind of delay. My flight experience was exhaustive, but eventually all good.
## 871 Palma to Barcelona. We booked our two tickets, which cost 173\342\202\254 from Ryanair but they made us pay an extra 134\342\202\254 just to get the boarding passes. An email was sent to us with no link. Moreover, their communication was rubbish and disrespectful as well as rude.
## 872 Worst experience I\342\200\231ve ever had, both my flights to and from Pisa were delayed. We weren\342\200\231t informed of this at any point and had to continuesly check the departure board to keep up to date! The customer service was atrocious and the only time I felt like they cared that about my experience was when one of the rude cabin girls was trying to sell perfumes or very expensive food on the plane. My plane to Pisa was an hour late and I understand that things can happen but the plane journey home was delayed by 8.5 hours with no explanation and no apology! They charge extra for any extra luggage other than a small carry on bag and charge silly money for things such as sitting next to the person you\342\200\231re travelling with. British Airways is a little more expensive on flights but at least their customer service is good, they\342\200\231re very helpful whenever you find yourself struggling with anything and they don\342\200\231t treat you like a money sign for the five seconds they have to try and take as much money from you as they\342\200\231re able!
## 873 Stansted to Faro. Never take Ryanair. They do not update their customers on the status of their service. The boarding process was delayed 30 minutes, but no one told us why. They are unorganized and not consumer-friendly. They do not let you check in your bag at the checkin kiosk. Instead, you have to drag your suitcase through security (which means you have to worry about removing all liquids from your suitcase before it gets scanned), take it to your gate, and then you drop it off yourself on a cart. There was no one to guide or instruct the passengers as to where to leave their suitcase or when it was time to do so, and there was no signage to denote that either. They were not prepared for us to de-plane when we got to the gate. We had to wait in the plane for 30 extra minutes. You have to pay for any refreshments. There are no seatback pockets for your things.
## 874 London to Milan. Horrible experience. 3 hour delay without any apparent reason. Arrived in Milan very late and missed my hired car (the office of Budget was closed, but this is another story). No possible refund. I will try to never fly again with Ryanair.
## 875 Cologne Bonn to Copenhagen . When we got to the airport to get our boarding pass, was told that we have to pay 55 euros per person to check in which can usually be done on a kiosk in 2 minutes. Our family paid 165 euros in the end. Our wonderful Europe vacation ended right there. This is the first time I experienced this kind of business practice. Then later I found in the fine print section on the ticket saying airport check in fee is 50 euros. Very disappointed and will never fly Ryanair again.
## 876 Paphos to Stansted. More than 3 hours delay. Boarded on time, then informed about a delay and then sent back to the airport gate. We were put in another aircraft and we left after 3 hours. Arrived in London and waited for the baggage for more than 40 minutes to arrive at the belts. All the people from other Ryanair flights were piling up, waiting for the belt number announcement to reclaim their baggage. Most of them had been waiting for 30 minutes already. Ryanair did not give any information, just blamed Swissport! Also, there were 100s pieces of left luggage from the previous day in front of Ryanair's baggage information desk, adding to the total chaos! Total delay for me was 3h45', which costed me to miss all my evening. Ryanair sent through an email stating 2h54' delay. However, the official departure and arrival information, states 2h59' delay. Someone is not telling the truth. Compensation is given for 3h and more. Of course they want to avoid refunds to their customers even if they are actually entitled to 0 which does not make me or my family and friends confident and keen to travel with them again. They needed to treat their customers better if they wanted to keep them.
## 877 Booked a return flight from London Stansted to Pisa and from Pisa back to London STN. Stansted outbound was delayed for 2 hrs 30 mins. Currently, I am waiting for my flight to depart. It was supposed to depart an hour ago, however, there is still no information available. Do not fly with Ryanair. Avoid at all costs.
## 878 Bologna to Stansted. A truly dreadful experience with Ryanair. Just 15 minutes prior to take off, having checked in etc., flight was cancelled (along with a number of other Ryanair flights) because of heavy rain - funny thing was, every other airline was continuing to fly, there were no other cancellations. There were no Ryanair staff in the airport to help or advise - check-in was being handled by other (I presume airport) staff. So, because of the sudden number of Ryanair cancellations all happening at the same time, that meant there was something like 1000 people all queuing to speak to three, non-Ryanair, staff at the information desk. We managed to book flights on another Ryanair flight, 36 hours (and two expensive nights in a hotel) later.The one good thing? I don't work for Ryanair. I feel truly sorry fo the staff (when you can find them) - they try to be helpful, but they know they work for a bunch of cowboys who couldn't give a damn. I can come home and decide never to fly Ryanair again, Ryanair staff (poor souls) have to get out of bed every day and go back into work.
## 879 Venice to Frankfurt. 55euro fee to check in. I truly expected more from a European airline. Very disappointed and will look for an alternative before booking again. Sad that I had this experience as they are very affordable and offer great routes.
## 880 Athens to Stansted. Flying Ryanair is never a good experience, the question is "how bad will it be this time". As always, the remotest gates, no jet bridges, long queues, and during the flight, terrible seat comfort, an announcement every 3 minutes that "you can buy something" and many more. At least this time, the flight was not cancelled, was on time and staff was friendly.
## 881 . to NaplesWhat a shambles! After not being able to check in online 2 hours before departure as informed on the website, I requested help from the staff in the airport. However, I was still charged a whopping amount of 880 dkr as a "check-in charge". Being a frequent flyer I have never in my life had problems with checking in on a flight, and I'm appalled at Ryanair's scams. On top of that the flight was delayed considerably, of course with information being little to none. I am not surprised that the staff have called for strikes.
## 882 2 hr delay at Pisa (including an hr in a hot, poorly air-conditioned plane), got to Stansted and there was no-one to open the plane doors (another 15mins) and then 1 hr 20 mins wait for our bags! Snacks trolley took an hr and 10 mins to reach us in row11 (not even half way down the plane!). Absolute shambles with the staff running up and down the plane to hand each other snacks as their trolley was insufficiently stacked!
## 883 Palma to Stansted. Absolute nightmare, disgraceful, painful and torturing travel. From the beginning of the trip, the flights were late, Staff at Palma airport was completely unprepared, shouting at people, being rude. We were asked to wait for the bus to get to the aircraft which took over 1 hour, under heat without being given any explanation or water. Then got inside the aircraft and had to wait again for ages before taking off - poor air conditioning. In Stansted, when we all thought the experience was over, there were 1,000 delayed passengers left stranded at baggage reclaim waiting for luggage for hours. Staff unprepared, rude and clueless. Overall? Was meant to be home at 19:00. Only got there at 00:00. Last time ever I flew with Ryanair. Never again.
## 884 We were flying from Thessaloniki to London Stansted airport on 15/07/2028. Not only there was a delay up to 1h and 40 minutes without even letting us know anything when we arrived and we missed our transfer there was no one at the customer service. The worst company. Unacceptable service and frequent delays (our forward flight was delayed as well)
## 885 Hamburg to Edinburgh. Unprofessional airline. My wife and I planned a trip together to visit my ancestral home of Scotland. We arrived at the airport at 04:55 am for a flight departing at 6:20. Ryanair does not have any staff to assist with baggage, instruction on how to get to the gate or that there is a preclearance requirement to travel to the UK, and no staff that assisted in any way including how to take baggage on the plane through security. We were among at least 12 people denied access to the flight as they didn\342\200\231t have a shuttle to the airplane once to the gate. Everyone was extremely frustrated and left without an alternative and no one can provide help particularly if the booking was made online. Even the staff in Hamburg airport were unimpressed with Ryanair and noted this is simply the way they operate. The inexpensive fare was completely wasted and one loses the return flight if you don\342\200\231t make the first flight. This is a \342\200\234fine print airline\342\200\235 that may work for the experienced traveler with the patience to lose their money a few times in order to get the hang of their \342\200\234method\342\200\235 but do not make the mistake of thinking that this is actually an air service. There is no service. This was a very disappointing experience and I\342\200\231m shocked the business model has survived.
## 886 Barcelona to Dublin. Horrendous experience. I flew with this airline on a return flight to Barcelona. Both flights were delayed by 1hr 30mins to 2hrs. However, it was the manner that they were delayed that was most frustrating. For both delays there was no communication from the airline. When we arrived there was no mention of delay until it became apparent that there was still no plane at the gate at the listed time of departure. After 45mins waiting at the gate we were finally allowed on the aircraft. However, the delay continued for another hour on the plane where it was incredibly uncomfortable, stuffy and hot. Overall I arrived 2 hours later than what was listed with zero communication from the airline besides an apology text to my phone the next day. The whole experience was not acceptable, even from a company that seems to have a reputation for this type of experience. he flight was the most uncomfortable and rocky flight I've ever experienced (and I'm someone that usually enjoys flying). Ryanair preaches low cost, however considering the multitude of ridiculous extra fees (e.g you have to pay upwards of \342\202\25415 for a seat even though you've already purchased a ticket?), the consistent delays, the lack of communication, the uncomfortable flights, and the low quality customer service, it is in my opinion far more worth avoiding this company and paying the little bit extra it costs to fly with another airline to guarantee a stress-free flying experience.
## 887 Rome Ciampino to Stansted. When I flew to Rome I bought the Priority that allow you to come into the plane first together with your luggage. It costs me \302\2437 at the top if my flight tickets that was around \302\24360. Now I came back and have been waiting on the airport more then an hour waiting for my luggage. On my way back I didn\342\200\231t buy a priority as I feel this is stupid for every single service that Ryanair provide. I was told by the person working in Ryanair baggage enquirers that it can take up to 1.5 hours? I am so disappointed and dissatisfied with them. Ryanair goes down every year. I will avoid them in future and there are better companies that are few pounds more expensive and can provide you amazing service.
## 888 Bari to Bologna. There was no cleaning from previous flight. Really bad service from the crew. As usual delayed.
## 889 Palermo to Stansted, the flight was delayed to start with with more problems but the main problem is when I get to Stansted. Light check in bag was not on the conveyor belt. I reported this to swiftbolt and they gave me a report. I've also made a complaint on Ryanair website - they've got a chat but for the last two days I cannot get through on it. It seems Ryanair could not care one bit about their customers so my advice to everybody do not use them.
## 890 Flew with Ryanair on a return journey from Brussels to Rome. Check-in at both locations, was quick and efficient. Flight attendants on both flights greeted passengers with a smile and helped everyone find their seats. Ryanair's policy regarding cabin baggage has recently changed, but it is clearly stated at every stage of booking. Additionally they send you a follow up email reminding you of this. I've flown with Ryanair multiple times and have always been happy with them. They are low cost airline, that doesn't hide it from you. They inform you up front of any additional costs you'll have to pay.
## 891 Prague to Bucharest ticket purchased through a third party agent. We arrive at the airport 3 hours before departure time. Thinking we couldn\342\200\231t check-in that early we first went to have a meal. When we arrived at the counter an hour 45 minutes prior the departure time we have been told we had to check-in online. We were like alright give me a minute I am gonna do that. Then the staff told us we had to do it at least 2 hours before departure time. Now it was to late we had to pay 3300 each (127 euros). Nothing is was made on purpose, we decided not to encourage this practice and to take the bus for 19 euros per person instead. Avoid this company.
## 892 Terrible experience flying Ryanair from Athens to Rome, even worse than my last flight on United. Keep in mind I also just spent 3 hours standing in line in the Istanbul airport a couple weeks ago. You'll walk 2 miles to get to your gate and they will make you carry your bags all the way there if you haven't paid extra in advance. Departure was changed 3+ times from a early morning flight to late afternoon, messing up connections. I'll never fly this pathetic excuse for an airline again.
## 893 Dublin to Budapest. Ryanair dropped the passengers off in the wrong country and provided no support afterword. After personally paying for transportation to my original destination, Ryanair refused to reimburse me. I will never fly with them again and do not recommend.
## 894 Thessaloniki to Stansted. Small seats and the worst customer care. I gave them more than one chance and I'm truly disappointed about every time !
## 895 London to Barcelona. First time ever to fly with Ryanair and this has been an absolute disappointment from the very beginning to the end. Booked my ticket in May 2018 thinking I had a bargain compared to the prices shown by other airlines. I even selected the priority option costing a little extra. This meant I could carry a 10kg bag with a small bag. Arrived at the airport to drop my suitcase but was told I had to pay \302\24350 because I didn't have this on my ticket. Completely shocked I argued but of course had no choice but to pay. After this the flight was delayed for almost 3 hours didn't arrive at my destination until 2am for a conference I had to attend by 8.30 the following morning. Well, thinking the nightmare was over and glad to have survived the ordeal. On my flight back, I thought perhaps the \302\24350 I paid would have covered both leg of my trip only to be told that I needed to pay another \302\24350 on my way back. Making a total of \302\243100 pounds excluding the cost of my original ticket which was \302\24398. While queuing pay for the cost of my laugage, I met several families who had exactly thesame problem as myself. Ryanair needs to state the exact cost implications of their flights. Now if I had known that this flight would have cost me almost \302\243200, I certainly would have flown with British Airways without any doubt. Well, you learn every day. I'm never flying with Ryanair again but it would be a complete injustice if I did not share my experience on here. Sadly the rating does not allow zero hence the 1/10
## 896 Lamezia Terme to London. A total joke - every flight is always late because they let the people that have not paid for cabin baggage on last and take away their bags at the gate, it's not until the last person has got on the plane that they start loading the "confiscated" cabin bags into the hold - 120 bags takes ages to load, so the entire plane with all passengers seated sits there for 30 minutes whilst the bags are loaded. This has happened every flight I have been on and every flight has been over 30 minutes ate taking off. Oh and the seats are the most uncomfortable on any airline.
## 897 Stansted to Frankfurt. 29 May 2018, Flight was cancelled without information and then no flight for 2 days. I have to buy ticket from other airline. Return on 5 June 2018 was delayed 4 hours. They did not pay a penny for compensation?
## 898 Edinburgh to Prague. I have no problem with the cabin crew. However the ground staff needs training in how to help passengers, not berate them. Most other airlines allow for a visa check at the gate. Not Ryanair. I was passed through security, appeared at the gate in plenty of time, but at the time to board I was told to go all the way back through security to a miniscule and obscure check-in desk to have my US passport checked for my flight to Prague. It didn't matter one bit that the Czech Republic is visa-free for US citizens, only that I was required to do this. Of course I was not able to make the flight, but even worse the gate attendant was outright rude, stating it was not her fault. The gist of it is she was right, but her completely unhelpful attitude also tripped out at least 4 other US citizens on the same flight. This regularly happens due to poor ground training and procedures. After writing a complaint to Ryanair customer service the response was predictable, no apology, it is the passengers' responsibility to check the visa requirements. Ryanair needs to amend their procedures and place a qualified individual after security and before boarding so there is no longer the need for paying customers to be inconvenienced by missing their flight. I will never fly Ryanair again.
## 899 East Midlands to Las Palmas. Rude Staff, ran out of alcohol and other Refreshments, left us outside plane Waiting For shuttle bus as they only had 2 buses instead of 3. Worst flight I've had. Avoid at all costs.
## 900 Skavsta to Stanford. Would never recommend using this airlane after today's experience. First we arrive at 5 pm in the morning, at the cost of our night sleep. When we have checked in our bags and gone through security, they inform that not airplane is coming, due to late arrival, until seven to eight hours later. Still they could not offer any hotel room until four hours would pass, as the airplane could come earlier than their estimation. When we arrive the second time the plane is first estimated 30 minutes later than before, then to change into one hour. No personal of Ryanair was reachable neither at the airport nor through phone. Later departure to the same destination by Ryanair went into air as normal without any possibility for us to board that plane. I just give a big warning of Ryanair, the worst flying experience ever, though I'm a frequent flyer.
## 901 Stansted to Cork. Our flight got cancelled about 30 minutes prior to take off; not delayed, completely cancelled. So I have no idea how the plane, on flight service, seats, or anything related ot the flight were as I never made it on a plane. So we waited in line for 3 hours to speak with a customer service representative about booking an alternative flight. When we finally made it through the line (many, many flights were cancelled this day), we found out that ALL Ryanair flights for the next 2 days to every location were completely booked, so the soonest we would be able to get on another flight was 3 days later. We had limited time where we were going as we were on vacation. So we decided to book with another airline (same day meant that it was very expensive). The customer service representative told us we qualified for compensation to make up some of the extra cost, and actually told us it was a good thing we got on another airline with how quickly all their flights were filling up. When filing for that compensation, we were told the cancellation was outside of their control so they would only refund the flight. We were given many reasons why the flight was cancelled by various airport and airline employees. Ryanair was not even willing to compensate money I would have lost if I had rebooked on their airline and stayed in London the additional 3 days. Next time I will pay a little more to go with a more reputable airline.
## 902 The flight time from London Stansted to Nuremberg generally takes about 90 minutes. My flight was delayed by almost 3 hours, resulting in an arrival in Germany at 1am. When Ryanair does the basics well, it is a very good airline. I want to get to my destination safely and an on-time. I have used Ryanair for many years because it never seems to compromise on safety and has had an excellent on-time record. Something is going wrong with flights from London Stansted, which, I believe, is Ryanair's largest base, as measured by aircraft and passenger numbers. When I travelled to Nuremberg, I noticed that a large number of flights were leaving with delays - my own flight's delay was the longest but delays of 40-60 minutes seemed routine. People have told me that there is an ongoing problem with Swissport, the ground agents at Stansted airport. This may be so but, at the end of the day, Ryanair is responsible for the agencies with which it has contracts and for the operation of its flights. When a ground agent is not available to staff a gate, that is, and should be, a reflection of Ryanair. in the case of my flight to Nuremberg, I was told that the plane was flying with delays because of a concatenation of events: a technical problem leading to a plane change earlier in the day; ongoing problems with Swissport; a loss of slot because of late servicing of aircraft by Swissport; ATC restrictions. The short flight passed without incident and the crew were competent and efficient. As usual, there was no-one available at Nuremberg to offer advice and assistance to passengers arriving almost 3-hours late.
## 903 Barcelona to Venice. I would never recommend this airline to anyone. There are hidden fees (55 euros per way) for improper check-in, the site is faulty preventing check-in, and the customer service is not helpful or understanding. Emails, due to poor design and overload of graphics go straight to the spam folder. The entire service is designed to nickel and dime customers, thus the company\342\200\231s business model is about tricking customers and writing special terms to catch them unawares.
## 904 Alicante to Newcastle-upon-Tyne. I booked car hire with my upcoming flight. I have now attempted to contact Ryanair several times to obtain a quote for an additional driver. Despite the company advertising \342\200\234live chat \342\200\234 options, on every occasion so far, I have been informed no staff are available! On one occasion, I waited ten minutes before being disconnected. It is virtually impossible to find a customer service email contact. My query is very simple but, as per, large companies such as Ryanair have no concept of customer service. On top of that, they appear to be advertising a service of live chat which does not actually exist! No one seems accountable and there does not appear to be any control or regulation of their customer service sites which promise so much but in reality deliver very little service.
## 905 Malta to Sevilla. I gave it one star, but if I could give it zero I would. It is the first and last time I fly with them. When I got to the airport they did even open the desk until an hour before we boarded. I had to pay 55\342\202\254 because I didn\342\200\231t do the check in properly. When I try contacting them they charged me .56\342\202\254 per minute and they never answer I was was on the phone for at least one hour. To continue my nightmare the flight was terrible, it was like a greyhound bus in the sky! The entire time people were walking and standing all over the plain it was a completely chaos.
## 906 Edinburgh to Stansted. My experience was terrible. Every possible hassle that I could think of arose. Couldnt check in attempted several times and finally was told checkin was closed. Also told flight had left before it was time. Had to find customer services at Edinburgh airport who was so helpful. She followed me through every hassle until i got my boarding pass. Took 2 whole hours to get through checkin and security. Had heard they were bad news but didnt expect them to be this bad. They really are what they say - cheapest airline, but I would add troublesome airline too. Special assistance did all they could to get me to the flight on time but she really had to get a move on. Got there just as they were boarding. Never ever again will I use Ryanair.
## 907 Barcelona to Berlin. My last Ryanair flight. Absolutely abysmal airline. They cancelled flights 2 weeks in a row and did not have next available flights for 2 consecutive days. Their chat personnel do not help at all by answering queries. There is a long waiting time and they are slow once on line. Their refund procedure takes 28 days, and further delay if they need anything more from your end. I never know if I will receive my refunds eventually and if I will ever reach a destination through Ryanair. I am a student and chose it to save costs but even at those low costs I will never book it again simply because of the delay and cancellation troubles, horrible customer care response and ridiculous refund policies.
## 908 Cologne to Manchester. About 100 minutes late leaving CGN this morning due to crewing issues. No information from ground staff regarding delay but nothing on Flightstats either. Once onboard all was as expected and was impressed by relief crew performance. The coffee was scalding hot this trip and as it should be and was probably the best drink I have had inflight in many years. I did not bother with food having already eaten at the airport. Overall very happy with the inflight experience.
## 909 Manchester to Cologne. A few minutes late departing Manchester but due to timetable padding arrived on time. Legroom was fine. Overall experience was very positive and much better than the last time I flew BA short haul within Europe. Service was fine, the only minus point was the coffee being lukewarm.
## 910 This was the worst experience I have ever had to deal with at an airport, they started to do check-in late and were extremely disorganized which caused the plane to be delayed an hour (to 11.30). We actually started to board at 11.45 and the plane was delayed once again delayed to 1.30, we weren\342\200\231t reimbursed with food nor water for the flight that took 3x longer than it should have due to their mistake. It also caused us to miss our plane to Boston with a group of 4 of us over a grand of wasted tickets. Now my family and I have to wait in an airport for up to 10 hours for the next flight. We will never use Ryanair again and recommend no one else to either.
## 911 Berlin TXL to Palma de Mallorca. Flew Ryanair on behalf of Laudamotion TXL-PMI and return. Booked seats in advance so my boyfriend and I could sit together and checked-in online. Outbound flight: Had no problems during the flight, we were on time, landed a little earlier, flight attendants were friendly (I sometimes tend to get sick and at first I panicked a bit as there were no sick bags but when I asked an attendant she gave me one). Unfortunately the crew was very hard to understand when they announced something on the microphone, I never understood them as the quality was very poor. One thing I didn't like is that we had a group of drunk guys on board and the crew didn't told them to be more quiet, they even sold more beer. Everything else was as expected. Inbound flights: Fine as well, departing and arrived approx. 15 minutes later than scheduled but okay. The flight itself was a little rough but not Ryanair's fault. It was a flight in the late evening and I wanted to sleep a little but the crew bothered a bit as they always tried to sell something like scratch cards. Everything else fine. Seats on both flights were okay, we are both quite small (1,67m and 1,73m) and the leg room is enough for a short flight like this.
## 912 We were supposed to leave at 5 pm. Plane was delayed for about an hour. After boarding we got a notification that, due to the delay, we had to wait in line to leave. This was around 6 pm. Half an hour later we got an announcement that we had to wait longer because of bad weather. And one hour later the flight was cancelled. We couldn't leave the plane for about another 2 hours and sat there without anything to eat or drink. We directly went to the desk to book another flight, only option was Friday June 1st. The day we should arrive home. Or in two weeks. We asked them to check 6 different airports, but apparently no options available the next day. They told us we could file a claim and get our money back. We filed a complaint, it got declined because of bad weather. This is not true. If the plane had been there at scheduled time, we would have left without any problems at our scheduled time. A plane to Bari with flight number FR8723, left on its scheduled time at 5.25 pm. So this is just a very convenient excuse but not true at all.
## 913 Abysmal customer service. Flight being delayed 2hours 30minutes is one thing, their communication is another. We were made to wait over 30 minutes with no explanation, no way to sit on anything. The 'waiting zone' was outside, we could plainly see our plane was not there. Yet they herded the passengers into this tight corner, outside, no where to sit, no explanation. When I complained I only got a shrug. Awful, awful experience. Seats were uncomfortably small but that is to be expected from economy class.
## 914 . Rome to Paris. Be watchful of the air fare. Dont get trapped by the initial ticket amount. You may have to pay for so many extras that the cost may easily exceed double the basic cost. In spite of booking the seats, priority & cabin baggage. I missed out on the check in baggage for which i had to pay 80\342\202\254. So be careful while booking the tickets.
## 915 Bergamo to Marrakech. Not very good for me. A good legroom but you couldn\342\200\231t recline the seat. Cabin service friendly crew but they could only speak a few languages.
## 916 All goes wrong with this airline from checking desk that you have to pay 55 euros for not doing online check-in without giving you any hints or alerts till on board that they take your carry on bag away to be carried separetly or check-in without your permission! Air crew were rude or at least the one that was at my flight to Rome from Brussels and serving rear rows from 25-33. I will never fly with this airline again!
## 917 Palma to Dublin. Ryanair does a great job making sure to skirt just around the EU laws. The flight was delayed 2 hours 50 minutes, and EU compensation laws kick in for this flight at 3 hours. We ended up landing in Dublin at 3:00 am.
## 918 Flew Berlin to Thessaloniki. That was my last flight with Ryanair. My patience is over with this company, they humiliate their clients every time. They call you to the gates and have you there waiting forever, the aircraft shows up 40min later and then they have you waiting outside another 20 min. Then when the flight starts, in order to reward you they force you listen to advertisements very loud, all over the way. I am not rich, I am a student but I prefer paying more and flying under normal conditions.
## 919 This is a very utilitarian experience, and they never let you forget it, even as FlexPlus passengers. We were denied access to the FastTrack security procedures at Manchester, which our ticket said we were entitled to. On the other hand, we appreciated the SMS confirming our departure time, and the extra leg room on the plane. The boarding process was efficient, and the seat wasn't too unforgiving on the back. The flight operated strictly on time. FlexPlus passengers' baggage appeared on the carousel last, well after the hand baggage of other passengers that had been put in the hold under Ryanair's baggage policy.
## 920 Flew Milan Bergamo to Barcelona. I would not recommend Ryanair to anybody. Very bad experience! I know that it's a low cost company and you don't expect much from it but better pay a bit more money and choose another airline. My flight was delayed 2 hours and nobody said anything as to why. The crew were very rude, they seemed very upset and at the end of the flight I asked for water and they didn't want to help, not even to buy and they got very offended when I asked. A big 0 for customer service.
## 921 Flew Dublin to Lanzarote. Excellent service. Once the Ryanair guidelines are stuck to and there is no breaching of the guidelines the airline is perfect. It may not have the bells and whistles but it's not expected as Ryanair are a budget airline.
## 922 My husband and I took a flight from Glasgow to Berlin and when we try to do the check in online their web site didn\342\200\231t allow us to do it, so we have to wait and do the check in directly in the airport and for that they charged us 151 dollars! Because they said that I had to do it online, when I explain that I couldn\342\200\231t do it because their web site doesn\342\200\231t allow me, they require me to give them a proof. Additionally, they charged us 18 dollars more and sit us separately without option! In total I paid for this flight 749 dollars, the most expensive I had paid for flight for two hours distance. I don\342\200\231t understand why the customers are very vulnerable to this type of company?
## 923 Milano Malpensa to Oporto. The flight was canceled 4 hours before the departure. Only alternative flight left was with the cost of 355\342\202\254 per person instead of the 52\342\202\254 paid already. Used the more economical option from Malpensa do Faro at the same day but caused high extra costs. It\342\200\231s a real shame for the lack of professionalism and ethic, will try to avoid this airline.
## 924 Barcelona to London Stansted. Terrible! Flight was more than 2 hours delayed. There was lack of information and really bad service from the staff. Overall a terrible experience! Can not believe that this is no. 1 airline in Europe.
## 925 Oslo to Stansted. The flight was delayed by an hour when we went to Oslo but to make it worse when we were coming back on sunday to go back to work on monday the flight was delayed by an hour so it landed at 10:30 pm instead and the baggage took 1 hour 30 minutes to arrive. Its 12am and I literally barely made it to the last train. Worst service ever. It will take me 1:30 hours to get home including a taxi journey and there is no trains to my area past 12am.
## 926 Madrid to Sofia. The most unhelpful customer service ever! What a scam Ryanair is with it's fees and charges that exceed the cost of the ticket. If you can, save yourself the headache and choose another airline. Talking to Ryanair's support staff was like talking to a wall. They are trained to copy and paste generic replies and cite their terms and conditions, over and over and over again.
## 927 Palma de Mallorca to Stansted. Flight delayed by 7+ hours (from 18:00h to 01:54h now and counting). No communication about the reasons for the delay. Plane packed with families with young children and babies. Informed at 01:31h, by the pilot, in the first photo public announcement since 18:00h, that the flight will be delayed by another 20-25 minutes because there is a thunderstorm above Palma airport. Why is RyanAir not offering any alternatives, such as hotel accommodation and/or booking us onto alternative flights? This would be farcical if it was for the fact that passenger rights are trampled over and we are being treated worse than cattle. Shame on you, RyanAir for allowing practices like this to persist under your leadership.
## 928 Venice to Stansted. Absolutely would not recommend. 5 hour delay on the flight and the most unhelpful staff. Didn't even bring us food throughout our entire wait when we were held in the flight for 3 hours. Didn't reimburse us because the held us in the flight not the terminal.
## 929 Alicante to East Midlands. Ryanair is a budget airline that i use on a regular basis, and what you see is what you get. I choose them because of price only and if you just book your ticket and not bother with all the silly add ons and take the time to read the webpage when booking, then, generally their price can't be beaten, You have to treat it as a means to get from A to B and take responsibility for choosing a low cost airline.
## 930 Girona to Pisa. Terrible airline! Extra charge can be more than ticket price and luggage. Extra charge just for 2 pieces of paper (registration tickets). I would never recommend this company!
## 931 Majorca to Liverpool. This airline is the most unhelpful company I have ever dealt with. I would avoid booking with them if you possibly can. My 19 year old son's flight was cancelled with no explanation for his return from a holiday. Along with his friends they were not offered alternative flights at first and we had to sort things for the back in the UK. Additionally when we did manage to get them a flight it only went to Leeds were they were left stranded with no support to get them back to Liverpool. No offer of compensation and after trying to contact the airline who refused to talk to us and did not respond to any emails or messages sent. This is a disgrace, customer service is non existent. Additional the second flight was also delayed by an additional 5 hours and again no offer of a drink, meal or anyone willing to speak to them. Overall the delay consisted of over 10 hours and 5 19 year olds being stranded in Leeds.
## 932 If you long for the good old days of riding on a Greyhound Bus, Ryanair is the one for you. The pre boarding experience is like nothing other than the crowd one would encounter in the bus terminal: packed. If you are 6 feet tall or more, think twice. The one redeeming feature of the seating is that the seats are upright with no option to recline.
## 933 Knock to Bristol. Very disappointed to have the flight delayed an hour without anyone informing any of the passengers of any updates. I had prepaid train tickets which are now invalid and have missed my train. Really really irritated.
## 934 Leeds to Bratislava. Bad service. Overpriced tickets and extra charges for basically everything. The priority service (which makes it possible to take the hand luggage on board) at extra cost provide literally no benefits apart from what should already be in the price and becomes a commonality rather than an exclusive feature. What is more, tickets when booked together do not guarantee having adjacent seats for which we have to pay extra in order to travel together.
## 935 Bologna to Stansted . Absolutely awful. I have never reviewed in my life and the incompetence and poorly trained staff have baffled me. No one tells you what is going on. We have been delayed going out and coming back. I understand that weather/technical faults etc can slow your flight down. However, the staff are rude and arrogant and tell all the passengers different reasons why we are stuck on the runway. Total incompetence and poorly run airline, will never fly Ryanair again.
## 936 Shannon to Stansted. Funny how all the flight from and to Dublin/Cork can arrive on time but not to Shannon! No Ryanair staff on floor, no explanation as to why the flight is over an hour late coming and going. People pay the money to expect their flight to arrive on time. Only apparently no one flying to Shannon has a job to go to. They would rather see the airport closed and have all the money going to Dublin. If you want to be on time do not fly with Ryanair. Uncomfortable seats, late, clinical, misrable
## 937 Terrible airline. My flight got cancelled from Berlin - Stansted (scheduled on 29/5). I checked on 29/5 and was able to choose any flights within the range of 7 days from any airport (i.e London - Barcelona or Barcelona - Porto or Porto to Paris). However, I didn't have a final decision until today (30/6). Contacted Ryanair chat and now they are saying I can change to any flights with origin from either my cancelled flight's destination or origin to sorry actually you can only do it on the same route. These were some of the worst customer service ever. They couldn't help but reply every 5-10 minutes. Bye Ryanair forever.
## 938 Edinburgh to Stansted. I\342\200\231ve never flown Ryanair so didn\342\200\231t know about the check in policy. Myself and my partner were charged \302\24355 each to print a boarding pass. Even the service itself was abominable. The staff were very rude.
## 939 Munich to Dublin. Had 2 flights with Ryanair, and each flight was the absolute worst. My girlfriend and I checked in 3 days in advance and we were not given seats next to each other, even though the tickets were ordered at the same time and we could *see* that the seats next to each of us were available. Ryanair then prompted us "Want to sit together?" We could upgrade. Basically they tried to charge us extra money to get the service that you get included in every other flight. Obviously we didn't do that, and when we got on the flight it was mostly empty and everyone could sit wherever they wanted. Ryanair wasn't doing this splitting the seating to 'improve seating algorithm' or 'allow larger groups'- they were doing it solely to milk another couple bucks out of us from our ticket. Same thing in a different vein for every other aspect of the trip from boarding to arriving - boarding groups, luggage, etc. There must have been a dozen different upgrades you could purchase to bring the quality of their ticket up to the standard quality of every other existing airline. Obviously every airline does this to some extent, but the breaking up seating was the one that really got to me. Their carry-on luggage options were just as bad on paper, though the actual flight attendants were very relaxed about what could and couldn't be brought on a flight. That might depend on the people though- on paper, you would struggle to bring anything onto this flight for free as a carry-on. Caused a lot of needless anxiety as we were preparing to leave our backpacks worked for 99% of other airlines, but would they cost us $80 to bring through Ryanair? If they aren't going to enforce the luggage stuff they should relax it on paper so it doesn't cause travelers so much stress. On top of that, every other part of the trip was irritating in every way. Boarding process started ~30 minutes late for both of our flights. They accidentally left us stuck in a hot and crowded staircase for half an hour waiting for a bus. At some point during the flight they tried to sell us scratch-off lottery tickets for additional flights, which was annoying and loud and also just plain *weird*. Despite how late we always boarded, the flight was never late. The pilots cut down the flight by a lot of time. Very noticeable in landing, I've dropped my phone with more grace than some of these landings. I guess this is technically a plus but feeling like your pilot is rushing is never a good feeling on a flight for me. In summary, it was a miserable experience all around. Hard to grade these things since cheapo flights all pretty much suck (you get what you pay for), but some aspects of this like the 'split up seating' really elevated this one to something special.
## 940 Seville to Cologne. Flight was delayed by more than 3 hours due to strike in France. Not the airline's fault, but had to stay in the standing plane without aircon for more than 2 hours. Crew was expressly advised by the airline not to provide drinks. Not even water was offered. Save yourself from this nightmare. Avoid Ryanair.
## 941 Madrid to Dublin. The bag policy is just a joke. If you don't buy priority, you wont be allowed a bag in cabin. It's not even a cheap company any more, next time i will fly with Aer Lingus or equivalent.
## 942 Stansted to Frankfurt. Arrived at the airport to absolute pandemonium! I could not download my check-in, the Ryanair web-site was down, the Stansted free wifi was not working, Appalling, no signage so no-one knew where to go and not one single Ryanair employee walking around to assist very irate passengers-although they could have done with a whole team! There was one customer service lady, attending to a \342\200\230line\342\200\231 of about 50 passengers - all frustrated and clueless what to do, where to go, but the queue at the Flexi-desk was kept free. And then a one hour delay in the plane and a further delay in landing in Frankfurt. A one hour flight took over 2 hours. Ryanair, never again!
## 943 Flew Ryanair from Budapest to Charleroi. Second flight in two days that was delayed by over an hour. This caused problems for myself on collection of vehicles from hire companies due to late arrival. I have problems with the airline before and do not recommend it. I would never use for personal travel but have to use for business, however I will be discussing with my employer that we no longer use the airline due to appalling punctuality.
## 944 Late Late Late! Taking Ryanair weekly at this moment (BRU/DUB) and unfortunately always late. Again this eveing 1 hr 10 minutes delay. They every time have an excuse to justify the delay (Air traffic control, strike in France...) but other airlines operating this route are never late. What the current issue! Why are you always late. Please keep in mind that being on time is our first concern!
## 945 Mykonos to Athens. A total rip off. Would not suggest anyone to take the airline while traveling to Europe. We were asked to pay 138.6 euros for two tickets extra, as we did not do an online check in. Not only us we met 5 groups of people having the same issue, and we all ended up paying 1.5 times extra of our original tickets price. The staff at the counter said that Ryanair sends you mails and reminders for the check in details but we didn't receive any mail other than the one time details we received while booking. (So did the other people facing the same issue) Haven't seen any other airline charging more than the ticket just to check in at the airport. They should have self check in counters instead of doing all this. Really upset with the experience. Thank you Ryanair for ruining my honeymoon!
## 946 Brussels to Dublin. 1 hour late, often late at the moment. 30 mins waiting in front of the gate, on the boarding bridge. Very warm and unpleasant. What\342\200\231s the need to have priority boarding if you need to queue for an hour on the boarding bridge!
## 947 Milan to Valencia. Good aircraft. Possible strike of French air controllers. We stayed on track 2 hrs. Departure delay at least 2 hrs. Very hot in the plane. Air conditioning at minimum. Personnel unkind to passengers. Personnel did not want to hear complaints. Started saying that they were up since 6am and were tired. However, all of them were standing at the front door were air was more respirable. People started to ask for water and they had to pay. Pilots failed to comment, nor gave explanations for the prolonged taxi. On the whole a real bad flight. Service onboard virtually non-existent. Lastly, the return flight was cancelled without MAIL, SMS, or CALL. We had to learn that from the news on TV the evening before.
## 948 Manchester to Palma. I had no issue with the Ryanair flight. It\342\200\231s cheap and cheerful. Seats don\342\200\231t have a lot of leg room and have zero lumbar support. The problem I\342\200\231ve had with Ryanair was the car rental. I paid for the rental which stated \302\24345 pound with no extra costs! When I got to Palma airport the actual cost was \302\243240 with \302\2431200 deposit. This was not stated when booking. I had no help from the people at gold car and ended up going elsewhere
## 949 Pretty easy to book and get the flight I wanted for the price I considered fair. Very easy and straight forward booking process indeed. Very good value for money. As I had already done the online check in, which was very easy to do, I just went to the airport and went straight to the boarding gate. The flight had a slight delay, nothing serious and very unlike Ryanair which is very punctual but the weather was very bad and so it was normal to get delays. Boarding was simple and fast, and ground crew were nice and very efficient. No hassle at all. Boarding the plane was also fast, the plane was very clean and the crew were friendly and helpful as ever, I don't particularly like the Boeing 737, seats are narrower than in similar airbus (not Ryanair's fault, it is due to the plane) and I don't particularly like the orange on blue Ryanair scheme. Seats are adequately comfortable for a 2h flight but I wish they had some pockets in front of you to store your belongings. Overhead bins had sufficient space. Crew were friendly and had the usual drinks and food for passengers to buy and the flight was fast and uneventful. Very smooth flight. Deboarding was fast and I didn't have the need to wait for bags as I had not carried any checked in luggage. I just wish the new cabins come quickly as this design is very dated and honestly, I would start to get rid of the awful stock photo you see on the fron bulkhead. I will fly with them again with no concerns.
## 950 Flew Porto to Ponta Delgada. Booking was very simple and straight forward, also was the online check in. I decided to had a bag of checked in luggage a few hours before the flight and the process was really easy and I must say, very cheap at 25\342\202\254 per a 20kg bag. Boarding was simple and fast, with very nice and efficient ground and air crews. The plane was very clean as always, and I must say I fly this route regularly with Ryanair and others and Ryanair is cleaner than some of their competitors. Also, I never got a dirty plane or seat in any Ryanair flight. We departed and arrived on time and the flight was smooth, with no problems. I did't buy inflight foods or drinks but there was a decent amount to choose form as there was enough duty free. when we arrived, picking up the checked in luggage was very fast and everything was ok with my bag. All in all it was very pleasant experience, with great value for money, a hassle free experience. Flying made simple, indeed. I just wish the cabin colours were a bit more pleasant and that they got ride of that annoying stock photo decoration on the bulkhead 'friends having fun' kind of photo.
## 951 Bristol to Malta. I have flown with Ryanair many times and this flight was excellent. The staff were very helpful and professional. The plane was clean and the flight comfortable and without issue. There was an issue with the card payment service onboard for myself and another passenger using Barclays Visa cards as the terminal connection couldn\342\200\231t process the payments. Other than that it was great. Really impressed with the cabin crew they were friendly and professional and a credit to the airline on this flight.
## 952 Milan to Stansted. This is the worst of the budget airlines. Tatty planes, horrible over priced food on board, frequently delayed and a multitude of hidden costs. Don't let you board early if you have young children (even babies) If travelling a budget airline Easyjet is miles ahead. Also let you board early with babies.
## 953 Sofia to Stansted. My first and my last flight with Ryanair! From the beginning to the end everything was awful! They took my cabin baggage with the checked ones, the seats were uncomfortable,the price of foods and drinks was too high, the staff was unpleasant and unhelpful (they even didn\342\200\231t give us instructions in Bulgarian language). Enormous labyrinth until we go out, a lot of walking and no information where we can take our cabin baggage! Horrible, unbearable and disgusting adventure! No more flights with Ryanair for me, my family and my friends!
## 954 Athens to Dublin. I have travelled with Ryanair many time, and am aware that in order to get the low cost airfare you have to follow the rules. I purchased a ticket from Athens to Dublin, 71.39 euros ,[1st may], received the confirmation booking, and the barcode ticket. When I went to board the flight I was told I could not as the payment had not gone through. I was told to go to arrivals and talk with someone in Skyline desk. I never received a email, text or phone call to say that the payment didn't go through. I was given a piece of paper with website, call center and working hours. Could not get through to the phone number so went on live chat with Ryanair, got no help, then i told them how terrible it was to be left in Athens and then i was told to contact the Fraud Department - of course no response. I had to buy a ticket from a travel agent at the airport (so helpful and understand of my situation), go to Paris and then Dublin with Air France, for 210 euro, but money and time well spent. I had the money to book the ticket with the same card I used with Ryanair, and knowing the way Ryanair operates, there was no point in loosing my sanity over a badly run airline. I got back home at 11pm instead of 4.30pm. Beware of booking your flight on the same day [less then 24 hours] - and know what you are getting into with a low budget airline, I feel sorry for the staff that have to front the bad attitude of individuals running Ryanair.
## 955 Budapest to Copenhagen. Ryanair supply the worst service when they cancel a flight. They refuse to rebook you on an alternative route, but if you pressure them they will allow you to book yourself. They will however later then refuse to reimburse you the cost of the alternative tickets even they have to according to EU regulation. Worst part is that they know they are doing something wrong. When you keep fighting they will eventually pay you, but not before you spend a lot of time arguing with their terrible customer service.
## 956 Stansted to Dublin. Stansted is awful and it was hot. However we all trooped on in time no issues over seats or baggage - obviously a well travelled bunch. All checked in online - as after all that's what it says when you book the flight (stop moaning about online check in and boarding passes). No problem with seating - spare seats allowed a little flexibility. Staff very pleasant - a little confusion initially as a trainee on board who confused who she needed to get bags put up in the hold. All dealt with a smile and a laugh and we were off. Drinks about average for a flight - arrived on time. Off like a ferret out of a trap at terminal one. Can't complain. Now Stansted airport that is another matter.
## 957 Stansted to Athens. This was my first time that I flew with RyanAir and I was quite worried having heard many people complaining about this budget airline. I was very nicely surprised as my experience was great. Plane space was the same as most airlines, they were punctual on their times, the staff was amazing! Never seen more polite, helpful people. I was travelling myself with my two year old child and they were so nice, attentive beyond expectations. Also service overall was great with variety in food options. I would use them again.
## 958 Leeds Bradford to Corfu. First of having to print your boarding passes when I don\342\200\231t own a printer is a joke. Secondly trying to check in online is awful. Not only is there poor internet abroad which makes checking in online abroad extremely difficult but it will not allow us to reserve seats together because apparently all the seats on the airplane are already reserved? The online help is again dreadful. I finally got onto the online chat room and asked for help to receive no reply after waiting for them! On top of this they then charge you to call up and ask for help. I will be avoiding Ryanair in the future after a disappointing service.
## 959 Bristol to Faro. This time just OK with one of the old aircraft and a crew who, in general, just did their job with no chat, smiles or eye contact but nevertheless efficient. The exception was the only female staff member - a charming Romanian young lady - who put her male colleagues to shame in getting my case down and carrying it to the airport lift for me. This flight, as with the outbound flight, both departed and landed more or less on time. Overall I am a very happy Ryanair customer. Just read the regulations and try a smile.
## 960 Faro to Bristol. This was my first 'special assistance' flight alone and the staff who were all friendly and helpful went above and beyond normal duties, helping me to my seat, stowing and retrieving my case from the rack and letting me move from my allocated centre seat to a window seat. Check-in staff were equally helpful - special assistance passengers are directed to the Flexi Plus counter - with only one passenger ahead of me and a wheelchair arriving within 5 minutes. I also tried the new Ryanair 'Full Breakfast' of orange juice, sausages,bacon, tomato, rosti and white pudding, Irish bread with butter and marmalade and choice of hot drinks.- served personally by the chief steward as he had never seen one before ! - and can recommend it at \342\202\25410 having had far worse on big name airlines. Departing I was helped with my luggage to the airport lift and wished a pleasant weekend. With it also being a new aircraft with the more comfortable seats I would rate this as being one of the best flights, long or short haul that I have had in recent years.
## 961 Lisbon to Ponta Delgada. My husbands colleagues bought us RyanAir vouchers as a wedding present. It was intended for both the bride and the groom of course. However they were the colleagues of my husband, so they bought it in his name. We very carefully planned what to do with these vouchers, when we finally thought that going back to Azores is the best way to spend them. We were about to pay for the 2 tickets from Lisbon to Ponta Delgada, when the system threw an error that only 4 vouchers can be accepted. We had 8. No problem, we thought. We would buy the tickets individually. So we bought the tickets for my husband, all 4 vouchers went through fine. Then we were going to buy mine, when the system disagreed, because the vouchers were in my husband's name. We contacted RyanAir, to ask for a solution. They have been using our wedding present for almost a year, and we naturally wanted to get something out of it. There only reply both through chat and complaint was that "please read the terms and conditions." Well. We are very disappointed, that something that has been intended to make us happy turned out so ugly. They have no flexibility, no customer care, no work arounds, nothing. This a terrible way to manage customer satisfaction. And we would absolutely NOT recommend this air line.
## 962 Rome Ciampino to Tarbes. Before choosing this flight I read reviews which worried me. I realised the complaints came from incidents, mostly from first time customer like me. To ensure I would not experience the same incidents, I read the procedures: bookings, luggage, check in, arrival time, etc. I booked 07:55 flight on 15 April 2018 from Rome Ciampino to Tarbes for myself, with plus service (this includes 20kg checked luggage). I installed Ryanair Apps to check in online (this is to avoid \342\202\25455 charge for check in at the airport). I arranged my luggage not to exceed 20kg allowance. At the airport I dropped my luggage at check in counter, wait for boarding, everything was fine. During the flight, everything was ok. Seats are non reclining, but hey it's only 1.5hr flight. Legroom was sufficient, I'm only 5'5" anyway. Service was fine although I did not want to spend my euros for meals on board. After the flight I collected my luggage without hassle. So it was a good experience. Learning from those complaints: be prepared, understanding the procedure before choosing the flight, comply with it, you'll get the good experience as I had.
## 963 Jerez to Barcelona. Not the best flight. Boarding process was chaotic and we had to walk quite a long distance, in the rain, to the aircraft which was not parked close to the terminal even though the ramp was empty. No boarding gate. Had to use the aircraft stairs which were wet from the rain. Flight was short and tolerable. Landing was brutal - hard initial impact followed by some airtime and a second impact. In fairness to the pilots I think they were fighting a crosswind but there were no announcements warning us of what was to come. We had a gate in Barcelona and quick baggage delivery. Overall, worth what we paid.
## 964 Barcelona to Milan. Worst airline I\342\200\231ve taken. I got charged 55\342\202\254 each for not online checking in, on top of that we were two hours early and they did not give us seats next to each other. It\342\200\231s a crazy amount of a penalty fee! More expensive than the flight and I have not experienced this anywhere else, and I have flown with other budget airlines.
## 965 Lublin to Stansted. Very bad overbooking experience. We were asked to wait till end of boarding to be told that my wife and son has to stay and I can go. My wife was proposed to go to another airport to catch other plane flying to London on her own, using public transport, or wait two days, but airlines will only pay for one night in Hotel. She was told airlines will pay compensation straight away, what did not happened. She stayed few hours in hotel then she decided to spend those two nights in our friends house. They never contacted her or me to arrange any help.
## 966 Malta to Stansted. Worst airline I have been on. The staff try to take my luggage to put in the hold of plane even though there was enough free space on the plane. Then we sat for 2 hours while the crew made excuses up why we were waiting. We sat in Stansted on the plane for an hour waiting for someone to get stairs.
## 967 Flew Dinard to London Stansted with Ryanair. Despite the stress caused by the delay and almost missing my next flight, I want to say a huge thank you to the cabin crew for being so friendly, kind and helpful. I had to run through the airport but I made it on time. Giving a good rating just because of the crew.
## 968 Manchester to Nuremberg. The actual flight was not a problem but my check in baggage was. I had pre-booked a suitcase on the flight. My wife had too. Her passport is from the UK: her bag went straight through at the check-in counter. I have a Australian passport and my bag was weighed, tagged and given back to me to carry to another part of the airport for some sort of separate inspection. At the "Special Inspection" station I put the bag on the belt and it zipped away - there was no 'inspection'. I have traveled in and out of the UK for 40 years on other airlines and never had to do this sort of ridiculous procedure before. To add insult to injury I had submitted my German residency card and passport for stamping at the check-in counter but the desk attendant didn't stamp my boarding pass and I was given a lot of grief at the gate for 'not having a visa check'. Kafkaesque and dispiriting - next time I will go on Lufthansa and save the grief.
## 969 Zadar to Stansted. The worst company ever! They cancelled the return flight from Zadar and they did not bother to assist us in any way! No re route flight available, no capable people to assist us in any way at the ticket desk, we were stuck with a child in the middle of the night in a small country with no possibilities for return. Shame on you Ryanair, I hope you will cease your activity soon.
## 970 Rome to Athens. Hands down worst airline ever! We were unable to print out boarding passes at the airport and they were trying to charge us to do so. I was not able to get on our first flight and had to rebook with another airline just to arrive in our destination. The same thing happened on our return flight using them. After spending over three hours on their online chat services which one rude representative disconnected us I was finally able to get them to wave our fee to get on the plane when asked for some kind of compensation for our earlier flight I was promptly told no and disconnected by them yet again. This airline cost us over $500 in fees and lost us two days of our trip to Athens. I will never fly with them again. I would pay triple just to book with a company committed to costumer service which is clearly not a priority with this airline but charging fees for their poor service is the utmost importance to them.
## 971 Flew Ryanair from Riga to Bremen. I and my family have been flying in this company for many years. First of all, I am very pleased with the price of tickets. If I buy in 2-3 weeks before, the price is really good. Time and date too, you can find the right one. The departure is usually scheduled and arrival is on time. In general, I like the company very much.
## 972 Toulouse to Frankfurt. It was my first experience with Ryanair and believe me it was worst. I tried web check in whole day of travelling date but not able to web check in because of web issues and also i called customer care to solve but got reply to go airport for check in. When i reached airport, they charged 55 euro for boarding pass, this charge is almost similar to flight rate, i am very disappointed with Ryanair, i didn't face issue with any flight but worst experience is with Ryanair.
## 973 Rome to Tel Aviv. Paid by mistake extra weight and have not received refund even it was long time before the flight. My hand luggage was at the dimensions and weight under the maximum limits. Without any reason they don't allow me to take it into the cabin. Other luggage belong to other people that were bigger were allowed to take it to the cabin. I will not fly again with Ryanair.
## 974 Malaga to London. Plane delayed. No apologies for all people until boarding. Also the plane was absolutely dirty. No happy at all. I think as customer that we deserve information at moment to advise our families and the plane should be cleaned properly. At customer I feel upset as I think we deserve better treatment.
## 975 Athens to Thessaloniki. Very cramped waiting area at the gate to board. They have been enforcing the new policy which makes it obligatory to hand in the hand-luggage before boarding, so that it gets stored - unless you pay for priority boarding. As I only had a rucksack I was allowed to have it in the cabin. The new policy has made more space in the cabin, boarding and leaving the aircraft has been quicker and the cabin was more comfortable. Some passengers have been complaining though, as they don't like that they will have to wait to collect their hand luggage. People have been moving around seats, in order to sit with their peers, however as this is a short flight it was not too much. Flights were punctual and almost full. Very cheap (40EUR return).
## 976 Edinburgh to Brussels. Worst experience ever and I\342\200\231ve has many good and bad. Arrived through customs 2 hours early then stood in a 45 minute line while our flight was delayed only to get to the gate and be told I had to verify my passport at the airport entrance a half mile away, go through customs again, and get back within 5 minutes or miss my flight. At least 12 other passengers had the same dilemma and not all of them made it. I had an asthma attack but made it. My wife is British and printed the tickets so didn\342\200\231t read the warning as it didn\342\200\231t spot to her and was tiny. Ryanair must either require non EU customers to check in manually, or have the first security gate flag up the need to have your passport checked. I\342\200\231ll never book with them again even if it\342\200\231s free.
## 977 Very unhappy customer. Supposed to be flying Toulouse to Stansted at 9.30, the flight has been delayed 2 hours with no explanation. I\342\200\231m sorry to say that I will be taking my business elsewhere after this due to Ryanair\342\200\231s disappointments vis a vis customer satisfaction, timeliness and sensible baggage policies.
## 978 London Stansted to La Rochelle. Terrible flight! They had to drop us off in Nantes because of the weather! That's fine. But the fact that we had to wait 5 hours at the airport for the bus to take us back to La Rochelle is unacceptable! Half the people from the flight didn\342\200\231t even speak French and didn\342\200\231t understand anything on arrival in Nantes. No one was keeping us informed. Only got to my destination at 2am. I have taken so many flights with Ryanair, and they have been getting worse every time! They are not even offering money back or discount.
## 979 Bratislava to Bologna. The flight was cancelled, airline couldn't find any flight to enjoy trip to Bologna. They refunded within 1 day the full price of airline tickets, within 1 week every services we missed. The fastest refund we have ever experienced! Thank you. In this case have to say, customer services very prompt, quick.
## 980 I have just tried to check in on line for a forthcoming trip to Milan with Ryanair, having had the debacle of trying to sit together with friends - this is just not possible unless you pay extra up front again!! Thought I had solved the problem by paying an additional \302\2436 PP Per flight for priority boarding. Only to discover that due again to their policy change this no longer includes early check in. The only way to sit together is to reserve your seats. Which is also a cheaper option than priority boarding but it doesn't tell you this when you make the booking. It is also not possible to change your Priority boarding to reserving a seat! The other point worth mentioning is that when you do book in the 4 day period before you fly, the Ryanair system seems to be designed to ensure that you are as far apart from your family as possible, which causes chaos at boarding as everyone then boards the flight and tries to sit with their family. If I have a choice Ryanair will be my last choice of carrier. No longer the cheap option they once were - they give you the distinct feeling they are trying to rip you off. Most certainly the worst of the cheap airlines! I will not use them again unless there is no other option - even if I have to pay more for the flight. Don't try to complain on the phone - they have no complaints department, just someone who keeps on telling you their policy has changed and to look at their website if you want to complain.
## 981 Athens to Stansted. One week before trip they send me a email that they change the bag policy. I had to contact them by phone and asked them and pay for a second cabin bag for my mother with special assistance wheelchair. Customer service is rude not willing to help you out.
## 982 Rome to Barcelona. I don't really understand the new baggage policy, but waiting at the arrival for 30 min (that corresponds to 1/3 of the time spent on board flying) for a small luggage is ridiculous. If it's made to "oblige" the passengers to buy the priority is very sad!
## 983 Madrid to Stansted. Horrible experience. I had to pay extra to get my hand luggage on the cabin, they charged me 55\342\202\254 for not doing the online check in even if I arrive 2 hours before my flight at the airport to check in. The service was poor and so slow. I won't fly with them again.
## 984 Ryanair is the worst airline. They\342\200\231re are incredibly greedy for money and cant find enough ways to steal from you. I\342\200\231ve flown with them before but never again! Firstly the ticket is affordable but each bag costs \302\24340 which means the cost of bags will exceed the ticket (so flying with a more expensive airline with more benefits and quality assurance will technically equal the money you will spend with Ryanair). Secondly, unlike every other airline it now requires you to pay \302\2436 (yes because \302\24380 isnt enough) for you to be able to take a small bag on board. I took a small trolley bag as I knew this was the policy and they still tagged it. My bag had no lock, was not strong enough to be put in the deck and had very delicate things inside. They only gave me time to remove my computer and all my appliances/makeup/many other products were left to be thrown away in the deck (and we both know what happens, bag breaks and all my things inside break). The best part is they only tell you about this policy in an e-mail after you buy the ticket! Yes it is written in the small letters of the terms, yet they know we don't always read it all, especially when I\342\200\231ve flown with them before and never had to do it so just assumed everthing was the same. When boarding, I realise half the top shelfs were empty which means this could all have been avoided, but like I said, money tops it all for this airline. No customer service quality, terrible unhappy and unfriendly staff in the airplane. All I know is that I have given so much time and money to this airline, but you can be sure I will never fly with them again. Absolutely ridiculous.
## 985 Dublin to Rome Ciampino with Ryanair on 2 non priority tickets. We had bought 2 seats across an aisle together as they were 2.50 each and actually the plane had plenty of empty seats so we ended up sitting together. Had they been dearer I wouldn't have bought the seats and instead more than likely sat at opposite ends of the plane due to that crazy seating algorithm that needs to go! Boarding at Dublin swift and efficient and staff were very nice and courteous on outbound flight. On time arrival into CIA. Due to not having priority boarding our bags were taken off us at the aircraft and we weren't waiting long for them at the terminal. On the way back, a similar pattern, really nice staff on board, highly efficient and pleasant. Interestingly they turned off the cabin lights and toned down the service after about an hour which was really welcome. I have to say the constant selling is tiresome but on this flights the hour and half with dimmed lighted was very pleasant and appreciated by all passengers. Small delay on take off as wind was 15 knots which was too strong under Italian aviation law but we were well updated by flight deck. More notifications as we flew right over Paris and over Heathrow I wouldn't have any problems flying Ryanair again but play by the rules. If you want an allocated seat and carry on luggage take a priority ticket. The price was good and customer service was of a good acceptable and dare I say it more enhanced than on some previous trips.
## 986 Birmingham to Malaga. We've all seen the online blogs about Ryanair's reputation for avoiding compensation claims, but I experienced it first hand when they cancelled my flight to Mallorca just 6 hours before take off back in October of last year, and I lost a fortune in transfers, hotel costs, train fees, travel money etc. I thought it would be very straight forward to get compensation for something for which I was totally blameless. Not so. I contacted Ryanair with all of my proof of purchases, and got an email to say they would pay me nothing because of circumstances "which was due to a general strike, outside of our control." I contacted the Ombudsman, Aviation ADR, and they contacted Ryanair on my behalf, and received a reply saying that they still would not compensate me. I went higher up and still nothing. I am continuing to fight this. I'm not going to say I will never fly with them again, because they are cheap. But the reputation Ryanair have for abysmal customer service and compensation claims is utterly justified. If you book, make sure you are ATOL protected, because otherwise you will have one mighty battle on your hands.
## 987 I thought I would flag what appears to be a persistent problem for Ryanair passengers flying from Frankfurt and the lamentable response from ground crew and Frankfurt staff. Bag security takes place at the gate at Frankfurt T2, not on entering the departure lounge (only passport needed). I arrived at the gate ~50 mins before the flight departed (let's face it - at STN with Ryanair you only generally start to board ~5 mins before the departure time) to be confronted with a large queue, all for the same flight. Security did not seem unduly concerned. Far from being last in the queue unfortunately I was directed to a very slow moving parallel screening queue for Xrays etc - which did indeed leave me one of the last downstairs to the gate, where I was witness to a queue of some 20 people already arguing with the gate staff who told them they were "late" and could not board. The situation was made more ridiculous as there was a half-empty bus waiting outside, for at least 10 minutes while the team of 2 on the desk refused to let more people past. Eventually this bus departed, only for another one to turn up - again we were not allowed to board this by the gate staff. Someone else turned up and we were effectively told tough, go and re-book as they would not let us through. As a result families were split as the block was seemingly arbitrarily applied from one passenger to the next - which was appalling, moreover he had medication for his wife and they still would not let the guy through nor make any attempt to get these to him. Clearly there was no communication between security and the gate which was hugely frustrating, security was understaffed as they could not physically process the volume of passengers in the timeframe (if I were more suspicious I would think there may be some 'special arrangement' to engineer this). Moreover this happens regularly - one of the gate staff told us *45* people were denied boarding under similar circumstances the day before and a quick twitter search showed this happened at least once more this same week. Overall it was a lousy experience but it seems to be a common problem - be warned if flying Ryanair out of FRA, get to the get super early.
## 988 In the old days Ryanair meant "Low fares simple". Now it means "Low fares with loads of hidden costs". Very poor and unprofessional service from boarding to flight attendants. All starts at boarding where a tag with limited liability is attached to your hand luggage if you don't pay "Priority" (which btw, seems to be bought by half the passengers nowadays). The "fake receipt" is then glued onto your ID which once resulted in one staff member actually breaking my plastic ID card. This tag is so made up you can just rip it off and try your luck getting your hand bag into the cabin. If you are traveling with your SO or a child, expect to pay just to sit together because it will purposely "randomly" allocate you as far as possible. Inside the cabin, you'll find the worst flight attendants the aeronautic industry has to offer. Those who often bump into everyone and will actually hurt you when you have an aisle seat, obviously without any apologies, that keep selling lottery tickets enhancing the flea market spirit even when turbulence requires all passengers to be seated. They sometimes forget to perform the safety procedures demonstration from start because they're on the phone. I once even heard one of them screaming when we "bumped" into some turbulence! Good luck trying to sleep if there are constant announcements over food, perfumes, tickets and other diversified sales. Also, Ryanair seems to think they're above EU regulations, no beverages are offered in case of a significant delay. Now the plus: It's simple and sometimes very cheap (although it often requires you to waste tons of money and pay exorbitant train tickets to reach its remote airports) Ryanair keeps growing without proper scaling and training, disregarding its customers and aiming towards maximum profit only. If an airline forgets the holidays of its pilots how can you expect it'll care about its customers?
## 989 My trip to Barcelona was only one weekend with my friend and had the most disrespectful trip on our way back. From Manchester, me and my friend who are European citizens, arrived just fine to Barcelona with no problem, our passport or ID was eligible for the trip, however, on our way back which was the day after, we passed just fine through the security checks and everything and we were trying to board on the plane but it appears for some reason that we couldn't. According to the ladies there checking our boarding passes, we had to have a visa card and they wouldn't board us on the plane. We thought there was a confusion since we arrived just fine with the same exact documents, same airline, same airport the day before and we had no problem through security but they appear to have a problem and wouldn't let us on the plane. We were trying to explain to them that we are European citizens and that we do NOT require visa. They wouldn't listen to us or even try to help us since we couldn't understand their response which was unreasonable! Everyone is boarded but us two and the gates closed and we started panicking, we couldn't believe that they will actually leave us. Until one lady that was working there too, thought that there was something wrong and she tried to help us by just calling her superior to come and check if we do need visa and she just simply said "no we do not need visa" . That was it! That was all needed to be done by the staff members who didn't care leaving two girls alone in a foreign country.
## 990 Had flight cancellations due to weather going back home to Dublin from Gran Canaria. Most helpful customer care desk. Ryanair really did all they could to get us back home. Very courteous and polite. Even connection flight and seating was sorted. Made such a difference to a probably stressful situation.
## 991 Dublin to Fuerteventura. I planned a weekend in Furtaventura, but due to bad weather conditions the flight has been canceled. Not only we booked the flight with Ryanair but also we rented a car and insurance with them. 2 days before departure at 19:30 i received an e-mail off Ryanair stating that I can move my flight free of charge to another date due to bad weather conditions, however the e-mail did not say that the flight has been canceled. When I checked the Ryanair website the flight has been marked as scedualed. I could not ring the Ryanair customer service because they were closed at 18:00, the next morning i rang Ryanair at 9:00. The lady on the line told me that my flight has been canceled and that they cannot refund my hotel, car or insurance expenses. She was speaking very fast and as I asked her for clarification and to speak slower she hung up. After my conversation with this woman the flight still remained as scheduled and tickets were still being sold, the Ryanair website was not being updated on regular bases and the customer service was absolutely disgraceful. As for now i still have not got my refund for my flight but I will update my post when ever i get it.
## 992 On this rather short 40 mins flight from Dublin to Glasgow, Ryanair proved to be ideal. They were punctual and reliable and the the check-in process was most efficient. The crew were able to serve drinks on a very busy flight and disembarkation was managed in a quick and orderly fashion but resulted in a bus transfer as I suppose Ryanair do not like to pay for the gates. My luggage arrived quickly and so I have no complaints at all. No complaints and will use again for short routes.
## 993 Leeds to Alicante. Ryanair are brilliant, cheap, usually on time etc. But they are shooting themselves in the foot by splitting passengers travelling together up. Theres no reason for this, its about trying to extract money from you. Come on Ryanair don't be pathetic, we love you but this carry on is silly.
## 994 Glasgow to Frankfurt. I understand all the complaints to a certain point. You have to know Ryanair's system, but when you do. you have a smooth flight. Cabin crew very friendly and the flight was on time. Luggage delivery was very fast in Frankfurt.
## 995 Flew Tallinn to London Stansted. Ryanair are one of those airlines that you choose as a last resort. They are just there to scrape every penny they can out of you. We wouldn\342\200\231t book seats out of principle and refused to pay for priority boarding - this means we could only check in 4 days prior to flying. Luckily I was able to do this, if it was your week/fortnight holiday, you\342\200\231d be stuck. My husband and son were on a separate booking to me as I had booked later. I checked them in first and got seats 9e and 20b. When I checked in next I got seat 9b. Clearly they could have given my husband seats near each other but they clearly want to make a point. Every time you press proceed you get asked if you want to change your seats at a cost. It\342\200\231s a pathetic money grabbing system. When we followed this same procedure with Wizz Air, seats next to each other were allocated. The man sat next to me had paid \302\24315 for his seat - I had paid nothing - ridiculous! When we arrived at Stansted we had to wait 30 mins for the belt number to come up. Surprise, surprise all the missing belt numbers were for Ryanair flights. Never again!
## 996 On February 15, I took a flight from Madrid to Berlin, the flight was delayed about thirty minutes. In Madrid Barajas Airport, at boarding time We were waiting for a half an hour standing up without any answer. On the other hand, the flight was confortable (legroom quite small) and the cabin crew was nice, but landing was one of the worst in my life. The low cost has risks!
## 997 I have nothing but praise for Ryanair who managed my flight home to Dublin from London Gatwick after I ended up on crutches having broken a bone in my foot! I was met at the airport with a wheelchair and given a buzzer to wear - when this went off I was greeted by a very cheery young man who directed my party and myself smoothly through security and into a hoist that brought us to the plane door. I was helped to my seat and on arrival was again met by wheelchair and delivery to the front door of airport to be collected - all done with a smile! Thanks to everyone concerned!
## 998 Flew Stansted to Grenoble. Whilst I am aware of the quality of flight I am purchasing when choosing Ryanair, I never expected what I got. For the 3rd time in a row, Ryanair were very late on departures. No justification at all. Just hand outs of a poor magazine to make customers wait. This airline has no consideration or respect to its customers. Even though the flight is cheap, one would expect a minimum of courtesy to explain the reason for the delay. I highly recommend not to use Ryanair despite its advantageous prices. Bad organisation, no time management, and total lack of consideration for passengers.
## 999 The service provided by the cabin crew was fantastic. At check-in Ryanair makes money by separating you from your family and loved ones. There was no room at all to pay for the seat so me and my family could sit together. I got 5D my mum got 1C and my dad got 17C so we were quite separated from each other. The cabin crew said "When everyone is seated we will see where we can put all 3 of you to sit together". Before push back a cabin crew member collected me and said go to row 2 and sit on the E seat, my dad was waiting for me. After all, my mum was siting in 1C me and my dad were sitting in Row 2 at D and E. It was really pleasing to sit in one of the front rows. One of the cabin crew was full of energy she was the best stewardess I have ever experienced travelling with! The landing was really rough as it was windy in Dublin. The captain warned us before take-off that we will have quite a rough landing due to strong winds. I was eating chicken sandwich and a Nutella-Go, the Chicken sandwich was one of the best budget airline offered food that I have eaten. We all had a good time travelling with Ryanair. Because we wre travelling in the second row on the right hand side we had a lot of leg room and I could stretch out without any problems. It was a pleasing flight with Ryanair.
## 1000 Flew London Stansted to Cork. Very strange airline. I'm not sure how they got to where they are as I don't really enjoy flying with them. Peculiar practice of getting people who have not paid 'premium' to take their bags to the gate and then once boarding put them on a luggage cart for loading into the hold. I guess might as well get the passengers to do the heavy work! Soon I'm sure they'll be asking the customers to load the bags as well. Luckily I was only travelling out and back in a day and had a small notebook. The main thing is that I got there and back safely and that's really the only positive thing I can say. The joy of flying is absent when using Ryanair.
## 1001 Flew Cologne to Dublin. Overall service standard is basic. Whilst there is nothing wrong with the airline, it is certainly a "no-frills" airline. Cheap fares, but expensive extras. Almost the same price to check in my luggage as I paid for my seat. The cabin crew could perhaps pay more attention to the passengers. When serving drinks and snacks, they missed out row 26 altogether. Slight delay due to a technical issue with the aircraft, however we were transferred efficiently to another aircraft, meaning the delay was restricted to *just* 61 minutes. I was travelling with a family member on the same booking, however, we were not allocated seats together. This is not the first time we have been separated in the past few months with Ryanair. I would however fly with Ryanair again due to the ticket prices and route network provided from my local airport (Dublin).
## 1002 Flew Thessaloniki to Rome. They offer cheap flights and then they try to trick you in order to get extra funds, for example the charge 55 euros if the check in is less than 2 hours before the flight! A day before the flight Ryanair contact me in order to inform me that I have to check in for my flight. I tried to check in through the email link but that was impossible for some reason, when I arrived at the airport a few minutes less than the two hour deadline they told me that I had to contact Ryanair to explain to me why I couldn\342\200\231t check in on time. In the meantime the deadline passed and we had to pay 55 euros per person. Never again.
## 1003 Flew Manchester to Budapest. Ryanair is getting worse by the day. I first flew with them about 2 years ago and for the price I paid I couldn't really complain back then but things are now changing. I have just returned from a short trip with my fianc\303\251 to Hungary and I dont really have a good word to say about Ryanair now. The initial price seemed ok but then comes all the extra's. Sit next to your parnter - Add \302\24324 to the cost of the journey. Add 1 check in bag - Add \302\24380 to the cost of the journey. Take your carry on bags on board the plane - add \302\24350 to the cost of the journey. The seats are the worst and most uncomfortable I have ever sat in on a plane and they seem to be adding more rows which means even less leg room, and I'm not a tall man so I really feel for people over 6 feet tall. They called the passengers to the gate and kept us waiting for over 45 additional minutes with nor aircon so it was like sitting in an oven. The planes are incredibly noisy and it was actually dificult to watch a movie on my tablet with my headphones due to a constant dull droning noise. I dont think it will be it will be long until passangers are charged to use the toilets.
## 1004 Gran Canaria to Bristol. Booked a package holiday to Gran Canaria for 4 days. Flew out with EasyJet no problem. Flew back with Ryanair. Online checkin placed me and my partner at different ends of the aeroplane. Had no option but to pay \302\24326 to sit together. On boarding the plane it was 3/4 full. This should not be allowed to happen even as a budget airline. I will avoid flying Ryanair whenever possible.
## 1005 As long as you follow the instructions all is good. I had priority boarding which entitles you to 2 cabin bags. Airplane was new and clean. The staff good for a budget airline. Arrived before ETA which is always important. Only bad thing is that they park very far and you need to walk miles in the airport to reach baggage claim.
## 1006 Frankfurt to Athens. Negative thing is that the gate was right at the end of the airport. Aircraft was good and new. Pilot didn't turn up so had a 45 minute delay taking off whilst waiting for new pilot. We made up the time on air so all so landed on time. All in all a decent flight for a budget airline.
## 1007 Rome to Palermo. Unfortunately, Ryanair is not worth it as a flight company. They charged me and my wife \342\202\25455 each for the excessive size of our trolley (which already had to embark for the new internal regulation introduced recently) for 4cm and my wife my 6\342\202\254 have taxed \342\202\254110 in total. Zero flexibility, a lot of rudeness and my wife politely asking for explanations was pushed away by the staff and it was necessary the arrival of internal security to calm the situation. In the end we had to pay.
## 1008 Flew Ryanair from Rome to Tel Aviv. We had a terrible costumer experience in the airport. The fight attendants checked the size of our bags to the centimeter. My bag was about 1.5 cm too wide, and the attendant required me to pay 50 euro without batting an eyelash (I ended up throwing out some of my baggage to save that 1.5 cm!) The procedure of boarding and passing through our carry on was thoroughly unpleasant and we were treated with great disrespect. The flight itself was fine, but we started it frustrated because of the awful ground service.
## 1009 Manchester to Lisbon. Pleasantly surprised after previous flights on this airline. I have to say it was one of the better flights with Ryanair. Departure was on time, arrival marginally ahead of timetable. Legroom as expected on a loco carrier. Service was actually good and cabin crew friendly considering it was the last sector of the day for the crew. Not having any drunken stag/hen passengers was a relief. Given the reduction in standards on BA I would happily fly Ryanair again as it represents good value for money with astute advance booking.
## 1010 Some days ago I made 2 bookings for a trip from Athens to Dublin and later on (the same day) I realised I needed to change the flight dates (and so I did) and proceeded to do it in the 24 hour grace period that Ryanair proclaims that it provides for this kind of changes. However, I was charged an extra total of 80 euros for both bookings (40 euros for each booking - 20 euros for each flight), although the old and new flight prices were exactly the same at the time of the change to the booking! Moreover, the aforementioned change happened in the 24 hours grace period (actually it was done less than 2-3 hours after the original booking). According to Ryanair's website and the 24 hour grace period (for this kind of changes) the dates change should have been at no cost (as the price of the flights at that time was exactly the same). I initially tried to address the situation with Ryanair's Live Chat customer assistance. But not only were they not helpful at all or even willing to try and check the reason for what happened, but they were also abrupt and rude. And of course no attempt at all at even pretending in trying to resolve my issue. Unfortunately, I have been a regular customer of the airline the last couple of years and I thought that if I address this matter through their website and the complaint forms (which by the way, good luck finding the proper link and form to submit one), that maybe they will be honest and upfront about the unfair charge and sort it out as soon as possible. I even sent them printscreens from the original flight prices (taken at the time of the booking and of course the new booking charges). However, the only reply I got back from Ryanair's customer service was a repeated standard reply prewritten form saying that the prices on the website are live and they may change at anytime (no one argued against that - however they don't even mention the fact that the prices were exactly the same) and that there can be a fee for changing the dates (no mention of the 24hour grace period). I confronted them replying to all these nonsense and they sent me the same reply, only to finally add the fact that once they receive a payment they cannot provide any refunds for any mistakes concerning the payment received (Great business policy, right?). Never trust Ryanair for anything. They prove to be one of the worst scammer airline companies there is.
## 1011 Madrid to Marrakesh. Ryanair, while servicing its customers with prices that are reasonable for flights in nearby countries (such as in my case, when visiting Spain, and flying to Morocco), knows nothing about customer satisfaction or conflict resolution. Aside from experiencing technical difficulties upon departing to Morocco when trying to check-in, my flight prior to and when boarding was equal, and my experience incredibly poor. The flight was announced to be delayed only 30 minutes, when the plane really landed over 2 hours later than scheduled. This caused for me to be stranded at the airport late in the night, as I arranged with my hotel to be picked up from the Marrakesh (RAK) airport, making me feel very unsafe. During the flight, one of the male flight attendants was being very flirtatiously aggressive with two women traveling together that I was sitting next to on the plane. Every time, in passing, the male flight attendant would take the opportunity to engage in unprofessional behavior with one girl in particular. At one point, the two exchanged phone numbers and planned to meet after the flight landed in Marrakesh (RAK), and this event caught the attention of other passengers on the flight. Also, en route, many of the passengers that were traveling in groups were kneeling in the seats, and talking to friends that were sitting behind them. This happened in multiple groups and was never addressed by airline staff. My experience with Ryanair has been frustrating and communicated very clearly to those working with Ryanair, three times. Unfortunately, it seems that Ryanair is a company that knows its own rules and regulations very well, and if you do not (as a passenger), you are considered unfortunate and will only receive a mere apology for any uneventful experience had with the airline. Paying a small amount more for another airline is much advised.
## 1012 Flew from Oslo to London Stansted. Worst airlines ever! We have to buy Priority boarding to have cabin baggage with us and still had to wait in a long queue. All people were buying Priority and the cabin was full of luggage! Ryanair have just found out how to make money from it. Also, the seats! Me and my husband were sitting on different sides of the plane, both alone in the rows! This is a joke. If we want to sit together - pay more money again! Moreover, the flight was delayed for an hour and we were stuck inside the plane. I will never fly with Ryanair again!
## 1013 Bag drop at Glasgow Airport was very quiet as I have experienced in the past, with just one agent on duty who double checked the weight of my bags as they were on the weight limit, and processed them efficiently. Usual long walk at GLA to the gate, this time on the main International Pier. Priority Boarding was enforced by the gate staff, who were keeping the queue well organised and started to board on time. On board, warm welcome by the male cabin crew member at the rear door and the cabin crew seemed to be on hand to help the last minute boarders who didn't want to be separated from their hand luggage. Very standard level of service on board, goods sold efficiently and the usual Ryanair announcements made. No word from the flight deck at all which was strange. The crew slightly irritated me talking loudly in the rear galley (I was in the second from rear seat) but one of them was lamenting the fact she had a "loud voice" so I don't think this was deliberately rude! The flight landed early and buses were in place very quickly to allow us to disembark. Smooth, no nonsense flight which will maintain Ryanair as my airline of choice on this route.
## 1014 Berlin to Bucharest. They were late and the staff was agitated because of it. They boarded priority travellers first without checking their tickets, so that half of the travellers profited and skipped the line without having the right to do so. We didn't want to ruin our evening, so we didn't object, we just wanted to get home smoothly. After boarding the aircraft and after having found a small space in the cabin storage compartment to store our coats, two late passengers arrived, each of them carrying a rather large suitcase. Without saying anything, the flight attendant took our coats out of the storage compartment from above our heads and into my wife's lap. She then pushed one of the suitcases inside and left. No explanation, no intention of helping us store our coats somewhere else. My wife stood up and tried to store the coats somewhere else. This got the staff angry, because they were keen on making up lost time and wanted to depart as soon as possible. They started shouting through the microphone, urging everybody to take their seats and saying that taking your seat is really easy to do. Not only were we denied our minimal confort, decency and respect, but they were now also offending us in public. When I asked them, during the flight, if their attitude seemed normal to them, they started shouting again and they immediately joined the one I was adressing as to create pressure and intimidate us. It was unbelievably rude and hostile.
## 1015 I booked Ryanair more through hope than expectation to fly from Madrid to Birmingham, I preferred to fly with Iberia Express but they fly on days not compatible with our schedule. A few days before we were due to fly there was the threat of Ryanair going on strike on the day of our flight 20th Dec, which had me regretting my choice however it was averted and our scheduled flight was unaffected. The flight itself was as good as can be expected. The cabin crew especially 1 young woman was friendly and welcoming. As there were several empty seats at the front they allowed passengers to use those seats. The plane took off more or less on time and arrived to Birmingham on schedule. 1 thing I will say about the priority boarding is, it's worth the extra money, it allows you and your partner/family sit together and gives some order to boarding having 2 lanes, I remember when it was 1 queue of boarding it was chaotic and seemed much longer to board.
## 1016 Gdansk to Stansted. Arrived on time, checked in, got on board on time and then captain said we will have at least 1 hour delay due to restriction from traffic controllers, and then delay even more. Got ticket with like priority boarding and insurance, I have to say this plane are very bottom line, compare to others, and then wait without any proper answer. I decided to give Ryanair another chance, but looks like they arent reliable.
## 1017 Really disappointed about all the supplements you have to pay after buying the ticket. The new rules about not having the right to bring your hand luggage with you on the plane (small purse + small hand luggage as typical) is absurd. Now you have to pay to be sure not to get it in the hold. In my case, I had another flight to catch so I needed to have my hand luggage with me which forced me to pay the extra price. Furthermore, we are two travelling, and when I made the checkin online the system gave us two seats far away from each other. Next option was; "You are sitting apart, do you want to sit next to each other?" Click yes, and an extra supplement is charged to change one of the seats to be next to the other one. Why just not put them together from the first moment if two normal seats are actually available??
## 1018 I always fly with the same cabin luggage. On my flight back home from Dublin to Kaunas, my luggage was recognised as too large and I had to pay \342\202\25450 for it. Lady who took my luggage was really rude, did not explain anything properly, was talking in an inappropriate manner. I felt very stressed and upset afterwards and I am very disappointed in the overall customer service of your airlines.
## 1019 Barcelona to Venice. I bought a Priority Plus ticket and it cost about 40 Euro, especially when I realised that I could get a lower price with separate add-ons. The seat is fair in terms of the space and the food is of an average price. The staff was friendly and the flight was just in time.
## 1020 Leeds to Faro. After the pilot/holiday fiasco I\342\200\231ve not found communicating with Ryanair easy. I was required to travel from Leeds rather than Newcastle. I paid for petrol, parking and underwent major stress in the process. Ryanair emailed me beginning of do December telling me they get back in due course but still no correspondence yet. They credited me with \302\243700+ and were quick enough to retract that mistake they had made. I\342\200\231ve now been calling them for 25mins+ which they said would take 12 mins.
## 1021 Flying from Edinburgh to Rome on 17 January. They allocated different seats to me and my friends, all tickets being bought by me at the same time. So different corners of the plane just because we didn't pre-buy the seats! I have never ever met this kind of thing.
## 1022 Zaragoza to Stansted. I checked in at Zaragoza airport a Samsonite suitcase and when I collected it at London airport it was badly damaged and unusable. I approached the Ryanair staff at the airport to make a complaint about it and a woman said to me that I had to make a complaint on the website because it was a bag older than 5 years. I insisted and she refused to acknowledge my complaint. Unbelievably, after making the complaint on their website they have come back to me with a letter that says: "For the purpose of a claim under 15.1.2, acceptance of Checked Baggage by the bearer of the Baggage Identification Tag, without complaint at the time of delivery, is prima facie evidence that it has been delivered in good condition and in accordance with the contract of carriage." My suitcase could have lasted for at least another 5 years if it hadn't beenfor Ryanair, but what I really find annoying is the way the staff conned me into not being able to make a complaint immediately.
## 1023 Manchester to Malaga. Probably the worst experience I\342\200\231ve had flying with Ryanair. Staff very rude, unhelpful and miserable. I understand that they are very busy but manners take nothing considering they are the first people you encounter when starting your holiday. Also found it very disappointing that they could offer very little in flight snacks.
## 1024 Stansted to Brindisi. Since more or less 6 months Ryanair say that if you want to have your baggage with you, you must a priority fee. This fee suppose to allow you to pass for first At the moment that you show your ticket. In the flight that I took yesterday this didn't happened, many people without priority passed before of me and this is something really unacceptable, doesnt make sense to pay something if after you cant have the service that you are paying for, i know for sure 2 people that passed before me and that are been relocated to the priority, even if they dont have it, and i guess that someone else is passed as well. Very very disappointed.
## 1025 I am disgusted at the amount I had to pay because I forgot to check in online. My round trip flight from Dublin to Glasgow was only $45 but it was another $40 checking in my bags. You\342\200\231d think they\342\200\231d offer free return bag check in considering it was round trip. When I got to the airport this morning they charged me 90\302\243 because I forgot to check in online (50\302\243) and to recheck my bags (40\302\243) in to return to Dublin. I checked my bank account and it was $122. That\342\200\231s an absolutely ridiculous amount just to \342\200\234check in.\342\200\235 I will never be flying with Ryanair again.
## 1026 I have over 20 flights with this company and still have current bookings with them, which means that I am quite delighted to choose this company. All the flights were on time. However, in my last flight which was mandatory to be on time, from Malta to Rome, from which I had a connection to Palermo, it had a delay of over 2 hours. Fortunately for me I left 4 hours exchange time, so this reduced to just 2 hours to get from Ciampino (Rome aiport) to Tiburtina (bus station). Still it caused some stress, because in case of a higher delay I would have lost my connection and had to pay an extra 200 euros to buy a train ticket later on that day. Be careful with sticking to time schedules, because this could cause huge problems in some case. Don`t forget your add: Ryanair arrives 90% on time.
## 1027 Malaga to Newcastle. We had a few issues at the check-in when the family I was travelling with (whom I was not related to) had trouble with the boarding pass which had a different age on then my actual age. However, the woman who was scanning the boarding passes was extremely rude and was even raising her voice at us. I understand there were issues but instead of being helpful she was terribly nasty and we were also allocated random seats This isn\342\200\231t worth the hassle and I would definitely suggest flying with a better airline.
## 1028 I went on a short city break with my boyfriend over New Year flying from East Midlands to Berlin and used the Ryanair app to check in at the earliest possible date (which was actually Christmas Day). When I checked in, I was allocated 2 random seats, 11 rows apart. I would understand if there were no seats available but both seats either side of the allocated seats were available to buy. Another money making con.
## 1029 Standard trip, no thrills, no problems flying from Ponta Delgada to Porto. All went smoothly from the beginning, right from the moment of booking when I got a great bargain, till the moment I arrived at the airport. Simple check in, speedy boarding, departure on time, nice crew. Departure and arrival just on time. Clean airplane, not very roomy but that is the B737 fault as those boeing planes are a bit narrow and so elbow room is not the best available. You can't expect much, there is not even a pouch to put your belongings but you have decent space for your legs and plenty of space for carry on bags as they monitor the ammount of bags carefuly. Very nice and enjoyable flight, as usual.
## 1030 First time on holiday with Ryanair flying from Milan to Catania, I booked for 8 people. Check in has been a bad suprise, since the "random" seat assignment resulted in 8 people seating in 8 different rows! Before confirming this seat assignement a notice prompted me to pay if I wanted the freedom to choose seats. This is exactly as any other low cost airline promises in theory, since most airlines advertises that you have to pay to choose your seat. Recent experiences on other low cost airlines (easyJet, Wizz Air, Vueling) however resulted in all the people booked together being seated together without any extra cost. For this reason I was surprised to have all of us scattered around the plane. Except this, the flight was good and on time. Seat Comfort is average for low cost. Anyway I feel this "trying to force" the extra charge for choosing the seat is a bit rude and out of common low cost market practices. I would fly Ryanair again if the saving is really significant, otherwise revert to other low cost airlines.
## 1031 Barcelona to Frankfurt. Worst airline I've ever flown with. Charging to keep 3 seats together when there is plenty of room on board the aircraft? Trying to charge $60 per ticket if your boarding pass isn't printed and not accepting mobile boarding passes in 2017? I expect hidden fees, but Ryanair is over the top. Do yourself a favor, fly with a more respectable airline.
## 1032 Porto to Milan. Today the day started with a delay in my flight without previous notice. Not an email, not a text message, I was only informed about it when I was in front of the gate to embark. The delay was of 2 hours which is not refundable but got me into a lot of trouble. I only had one bus to go to from the airport of my arrival to my destination and that bus was scheduled for 1:30h after a normal arrival. Since the flight arrived around 2:30h late, I missed the bus. I couldn't get the bus ticket refunded (20\342\202\254 to waste) and I had to stay in the airport for 10 hours waiting for the next bus as I was traveling alone and leaving the airport with heavy luggage is not comfortable at all. I was trying to write to Ryanair to at least get some discount on my next flight since the delay was on them but I can't even get in touch with them because they have it in the system that the delay was under 3hrs so by European law it is all okay.
## 1033 Flight from Stansted to Berlin 7.50am boarded late, not the end of the world but hardly perfect, 1hr later still sat on the plane, 3 hours later. It's snowing now,still on the plane - captain assures us the runway is open and we will be off momentarily. Asks the stewardess for some water to be told I would have to pay (despite EU regulation and Ryanair website explaining after 2 hours they will feed and hydrate passengers). I was told to get food we would have to go to the terminal except they wouldn't and couldn't open the door. 6 hours later the captain promises that help is on its way in the form of a staircase to take us back inside Stansted but still no sign of a staircase (unless you count the one outside the aircraft gathering snow). 6.5 hours later we depart. Finally we are in the air, bewildered and shocked that Ryanair can ask a full plane of customers to sit for over 6 hours without water, without food and without explanation.
## 1034 Tel Aviv to Paphos. EasyJet pricing is much more transparent and their customer service is substantially better. Ryanair seems like a good deal at first but suffers from obnoxious pricing schemes (randomly allocated seating just makes a huge mess at takeoff and serves no logistical purpose besides coercing you into paying an extra 25 Euro per person to sit next to your family) and absolutely terrible customer service that refuses to directly answer the questions you ask them. First they had a mistake on their website when I booked, causing me to pay for unnecessary priority boarding. At the airport we didn't actually get priority booking because a bus took us to the plane which was full of passengers who didn't pay for priority booking and we boarded after them. When I contacted customer service they refuse to acknowledge the initial mistake so I asked them questions about the new baggage policy which they won't answer directly, but simply copy and paste from the website (I can actually read, thanks). When I explained that I didn't even get the priority boarding that I paid for I get another copy and paste about how they are a non-refundable airline. It's impossible to have a dialogue with the customer service team because there's no way to answer on the same thread that you opened, even when I went through their complicated Contact Us menu, and try to update an existing complaint, the system said that the customer service number I've been given is not valid as it is 7 digits instead of 6. So every email I send them I have to do through a separate complaint in which I need to attach the previous emails as documents.
## 1035 Milan to Madrid. I was traveling with my wife and we did the boarding online, as you are charging 4\342\202\254 per seat we did the free one and it placed us at 6b and 26b which makes no sense but I understand what they are doing! There was about 15 couples on the plane and friends which all started changing seats so they could sit together, meaning more confusion. When couples buy their ticket together just let them sit together and you will make customers happy - its nice to have customers happy even at low cost services.
## 1036 Prague to Stansted. Since British Airways are really expensive from Prague, this was the only early morning option. This aircraft is based in Prague and as the first flight of the day it was on time, which is important. The interior is nothing extra and I miss seat pocket, because I use it for my phone and etc, so this is thing I don't like the most on Ryanair aircraft interior, legroom is small as well, but I'm not really tall so it's alright for me and prices on board are reasonable. Boarding was quick and efficient, same for deboarding. So on this flight everything was ok and it's really good value for money.
## 1037 Lanzarote to Berlin. Upon boarding the pilot announced that the plane is too heavy for the fuel to be enough and so we will have to land in Frankfurt to refuel and only then continue to Berlin. An hour delay before departure in Lanzarote, after boarding. Another hour refueling in Frankfurt and in total we spent almost 8 hours in the plane for what should have been a 5 hours flight. The plane landed just 15 minutes before the 3 hours delay which would have entitled us for compensation by European law. On the plane we were never offered any kind of complimentary food or drinks. We were not offered water. The toilet door handle broke during flight which made the front toilet unusable until the refuel landing in Frankfurt. We would've chosen another company if it was possible but they're the only ones flying direct. I will also mention the flight there from Berlin was delayed two hours after boarding.
## 1038 Podgorica to Stockholm. This airline doesn't have a very good reputation for service, so expectations were low. But since the route was perfect for me, I still chose it. And I was positively surprised. Having recently flown a major carrier I actually found the Ryanair flight better. Check in is easily done with their mobile app, and it is of course a bit annoying that you have to pay extra to choose your seat. But still a lot better than it used to be when you had to stand in line to get a decent seat. They also have a very good system for cabin luggage. Either you can pay to take it on board, otherwise they only allow a limited number of large cabin bags, the others will be placed in the hold free of charge. This makes boarding much easier, and you can actually find place for your duty free bags and coats in the plane, something that can be almost impossible on other airlines. They now also allow an extra small item, which is far better than they used to be. I was also surprised by the leg room, which was good even for me who is quite tall. Since the seatbacks cannot be reclined you don't end up with someones seatback very close to you. The next surprise was their meal service, where they served good food for low prices. I even manage to find a gluten free meal, which was easy to determine since all items were clearly marked with allergene symbols. The departure was delayed for an hour due to snow in Sweden, and before landing we had to wait more while the runway was cleared from snow. But I found all staff very professional and pleasant. Ryanair used to be an annoying airline with bad passenger service. But while other airlines are constantly deteriorating and copying the low cost airlines I am happy to say that Ryanair is getting better and better. If it wasn't for their annoying habit of seating passengers travelling together apart from each other unless they pay, I would give it a higher mark still.
## 1039 Athens to Malta. Luggage policy. Before if you added after booking the ticket was 20 euro, now they put it 40 euro. You pay the luggage and then at the airport for other people they take their luggage for free while we have paid the expensive fee. I booked and while I had the ticket confirmed and in my iPhone wallet the system showed my as off the flight and I had to re-check it. While the show the ticket they told me i had to recheck in and while there were 5 min left before the flight was closing the system wouldn't allow me to check in from the app and while I was in the office they told be to pay extra 50 euro because the had to check me in. Totally unacceptable, cannot be any worse company than Ryanair.
## 1040 Passengers travelling with children need to be aware that if you do not pay for seats Ryanair will split your family up. I have just checked in for our flight. We really don\342\200\231t care where we sit on the plane but after checkiing in we selected free allocation and were offered window seats 7F, 23A and 31F they could not have been anymore far apart. When we looked at the seat map we found that next to each allocated seat were two free seats - how ridiculous and mean is this. I can\342\200\231t have our nine year old sitting at the front of the aircraft in 7F next to a total stranger so we had to pay for one adult to sit next to our son. I believed that it was the law that an airline could not split children up from at least one parent. When your travelling with children and booking a ticket with Ryanair you do have to select if your travelling with children. I believed this was to stop the system splitting a child up from at least one of the parents. The child fare is the same price as an adult with Ryanair so why do you have confirm one of the passengers in the booking will be a child? Ryanair this is extremely tacky, and obviously a money spin to earn more money. Not happy or impressed how you treat families with young children, shame on you.
## 1041 Liverpool to Barcelona. I travelled with two kids and even though the staff could see me struggling to fold a double buggy whilst carrying a heavy bag and a baby they offered no help or assistance. Thankfully other passengers helped me to get on board. When I was on the return flight home same happened, didn't even bother to ask. At one point my daughter had dropped some pringles which we paid ridiculous amounts for and a passenger stepped on them so I couldn't pick up the little crumbs. The crew member walked past and picked up the crisps and muttered other passengers have to board this plane too you know. I just thought how rude! And also why do they not clean the aircraft between journeys! It was filthy to start with. Greasy seats and magazines on the floor! Just shows you get what you pay for. If the service was better then it would have been full marks! Also the food is so limited - for vegetarians they have a panini which is always sold out even though I've been like the second customer they've served on numerous occasions I've been on the flight.
## 1042 There were many hidden costs and I made a mistake in checking in the return flight before the first flight and had to pay 50\342\202\254 per person, I was with my wife so 100\342\202\254. This put a downer on the whole holiday! I dont think i will be using Ryanair again because even when i explained my mistake, the staff just laughed at it and were really blunt and miserable which made me feel even worse!
## 1043 We had a very cheap flight flying Ryanair from Birmingham to Verona, but even so the flight crew were not very helpful and actually quite rude! The seats were very dirty with rubbish left on the floor and the downside of seat, no room in above locker. My bag was way down the cabin from my seat, would not be accommodated to sit together even though there was empty seats, now I have just heard they are thinking of going on strike on 20th Dec, that\342\200\231s very nice of them!
## 1044 You get what you pay for. We paid 85 euros for a Hamburg to Lisbon (round trip) plus 10 euros for a seat Reservation, which is just ridiculously cheap. One thing that I did not like - and which I haven't experienced when flying Ryanair before - is that the system for the online check-in is splitting up Groups on purpose to make you pay for a reserved seat. However, 5 euros are okay for a seat reservation. The 737-800 was quite new, seats are as usually not too comfortable and food and drinks were not included - which I am not expecting when I am paying such a low fare as I did. Both flights were more or less on time.
## 1045 The boarding of the flight was somehow chaotic and not well organized, however the flight boarded on time with no excessive luggage in the cabin. Flight 80% full. People were assigned random seats separating groups from one another and this resulted in a lot of them switching around before take off, even during the safety demonstration, and after take off. Crew tried to stop them, but they did not manage to enforce order. After take off the roof was dripping water on me, which was annoying - this lasted for like 20 minutes. Flight departed and landed on time. Very cheap (25,49\342\202\254 for a one way ticket).
## 1046 Budapest to Stansted. I found this airline the most opportunist of all airlines. For the 15 minutes delay in checking-in they charged me \302\243100 whilst I still have 1 hour 45 minutes to the boarding. I would have rather paid more money at purchase than paying a penalty fee. It\342\200\231s just not right.
## 1047 Malaga to Amsterdam. Terrible service all around. If you don't check in online 2 hours before flight, you'll be charged 50\342\202\254. For no real reason. No previous notice. Just got e-mail few hours in advance. Very easy to miss. Food is not free and it is of a bad quality. Even water is paid. Small seats. Flight attendants are fine but company rules are strict and stupid.
## 1048 My girlfriend and I booked roundtrip flights from Barcelona to Tenerife, and we were notified to check-in online before the flight in order to avoid $50 check-in fee for each person at the airport. I clicked check-in on my reservation email, and they up-sold me seats for $90 during the online check-in, which was fine, and I finished the process. When I went to the airport, they told me we hadn't checked in and that we just paid $90 for regular seats, not even together with my girlfriend, and not in any special part of the plane. Insisted we had to pay another 50 euro each to check-in. I told the customer service to bring a manager to speak to and he denied it saying we could speak with him. I took a picture of the "Ryanair customer service" sign in order to give them a bad review, and he freaked out and told us "You will no longer fly", and even though we were there 2 hours before, didn't let us fly. I had to scramble to find a hotel for another night in Barcelona late at night, and pay an extra $480 for last minute flights the next morning for my girlfriend and I. This is by far the worst customer service ever. I will never recommend or fly Ryanair again.
## 1049 Rome to Athens. I have flown on many airlines but this is by far the worst. If you do not have tickets confirmed and printed before 2 hours expect the printing to cost as much as the flight itself. Upon going to the gate the people at the ticket desk were randomly telling people their bags were too big and charging them 50 euros to check at the gate. There was no rhyme or reason to it people were selected at random. Some had larger bags that were getting through those that were stopped. Their comment every time was that you booked a cheap flight what did you expect. Do not go with this airlines because although it is cheap when you add up all of their random fees you can get a better flight with someone who is upfront with their charges.
## 1050 Porto to Stansted. If you are flying via Ryanair with little children please be aware of their scamming operation! They say you can take baby equipment safely enclosed in a box or hard case so long as it doesn't exceed 119x119x80cm and a max of 20kg and truly, flying out from Stansted is fine because that is the rule - however when you come back home its another matter. You are only allowed 1xbaby equipment max of 5kg despite the fact of going out you can have two free baby equipment and we paid for an extra one too. We were charged for having less coming back home as we exceeded the rule. They have a different rule for every country you go to apparently and also they commented that we were yet another of the same case. After having flown with Ryanair for the last 14 years with no problems I will never fly with them again. Was super stressful with a screaming baby and all!
## 1051 Budapest to Dublin. I have flown on many different discount airlines, both inside the states and outside mainly in Europe. I've never had a worse travelling experience than with Ryanair. The airline has yet to be on time for flights, and for this trip was delayed both ways significantly. (An hour sitting on the flight to Dublin and already 20 mins to Budapest.) The attendants are rude and unhelpful and do not provide any useful information. For example, telling the cabin the delay is from a attendant who was going home because he's sick instead of the reality that he never showed up, which is what was said earlier. It wasn't that only instance where the staff acted errantly. On the way back to Budapest my fiance and I got belligerently approached by a staff member who demanded to know why our "Visa Check" had not been completed and that she didn't have time to check it herself. (Even though we've been waiting in the delayed priority line for the plane for 20 mins). I tried to explain to her that the staff we dropped our luggage off with said we had nothing else to do but go to security. Finally, the website also needs to have a better system of checks when offering other services, like car rental. My fiance and I rented and paid for a car in Dublin, knowing that an extra fee is often charged to people under 25. The site gave no indication that this wasn't taken in account for, or that there was an issue with our rental. When we showed up the company would not give us a car, and did not offer us a way to contact the airline for a refund. We have yet to get a reply from customer service in their limited and costly to call internationally hours. I will never buy another ticket with this airline again.
## 1052 Copenhagen to Stansted. I and my mate were assigned to two distant seats, even though next to both there were two seats empty. The airline puts its best efforts to make its flight miserable. Via the airline Web site I also rented a car, which I was unable to collect due to a clause, (the rental agreement was 20 pages), which requires the UK driver to produce a DVLA (Driver Licence Agency) passcode. The DVLA Web site was not available when I attempted to collect the car. So, the car rental required an additional \302\24315.00 in order to use a Premium Help Line and get the passcode. Last, but not least, they asked me to sign a clause granting the rental car company to charge my credit/debit card of any fee, fines, even if I was not present. It appeared to me as to sign a blank cheque. What you pay is what you get from Ryanair. I will stick on booking the airplane seat only for the time being.
## 1053 Stansted to Limoges. Possibly the worst airline customer service. As I checked in the agent handed me back my boarding pass and travel documents but kept my passport by mistake. By the time I realized it was missing, I was at the gate but with 40mins to spare till the flight went. I though a simple phone call to the check in agent would solve the issue. First there was no signs of any Ryanair staff at the gate. Only Swissport agents who could not care less about my issue. I had to insist for them to ring the check in desk. The agent acknowledged they had my passport. However they would not bring it back to me. I had to go get it myself. The gate being the furthest away meant a 20 min run both way. In short there was no way I could exit security and return to the gate on time to catch my flight. I asked them if they could wait for me for a few extra minutes rather than offloading my bags. Their answer was no, and the gate will be closing soon too. Any airline who respect their passengers would have had the passport rushed to the gate on time by one of their staff. Especially so since it was the check in staff fault. As a result I ended up missing my flight and best of all I had to pay a re-booking fee of 100 pounds, even though it was the check in staff fault. I also had to book a room at the airport hotel which cost me another 100 pounds. I did wrote to Ryanair about the issue and other than standards letter of apologies explaining that they can't be held responsible for the agents lack of support they were not prepared to cover any extra cost involved. This is a gross misconduct coming from Ryanair. Ryanair already have a very bad reputation, and this is just adding on to that pile.
## 1054 Ryanair from Gatwick to Dublin. Had problems with barcode at security - ran down to Ryanair desk - very helpful lady - told me not to panic and issued fresh ticket straight away. Called to gate promptly and started loading passengers within about 20 minutes. All done by cabin crew in an efficient and friendly manner. No problem with cases or seats. If people not sat together it was not an issue - short flight. The newer seating is much better than the dreaded old lumpy seats and makes for a much more comfortable flight. Landed on time and off and out into Dublin. Best flight so far this year.
## 1055 I had a flight booked from Stansted to Dublin on Nov 15 at 17:00. Due to a 30 minute delay on the bus from London to Stansted, I got to the gate a few minutes after it was closed. To put me on the next flight, they charged a fee of \302\243105. Even when there were about 5 seats available on the next flight, according to the representative who took my plight. Meaning, I paid extra \302\243105 for a flight that had previously cost me \342\202\2545. All other airlines are willing to accommodate this kind of extreme situation, except for Ryanair. Poorly managed, terrible customer service, and on top of it all, they make it extremely hard for people to complain (try and look for their Customer Service number). In reply to my complaint, Ryanair said that charging me that fee was a "gesture of goodwill" for the fact that I was late so, according to them, the fault was mine.
## 1056 Rome to Tel Aviv. We were seated separately, and even after a passenger agreed to switch seats with us the air crew prevented it. Before boarding the crew was very rude and checked passenger hand baggage for overweight in order to charge extra money. The entire atmosphere was as if the passengers are not customers but a source of money that should be exploited as much as possible.
## 1057 London Stansted to Barcelona. I fly Ryanair regularly but they have a new policy of seating people apart when they buy tickets together, just to charge more money. I was flying with my wife, we checked in in advance and saw that they sat us apart even though there were plenty of seats free. The flight was actually far from full, both seats next to me were free when I got there, but they still would give us separate seats. They are going back to being the cheap inconsiderate company they were before! I will always try to avoid them from now on.
## 1058 We flew as a couple to Bologna for a short break. We didn't pay to sit together as we think this is a complete rip off and Ryanair need to look at their policy regarding this. We checked in together on both occasions but we were seated separately despite there being numerous empty seats in the cabin. Take off delayed by 45, no info from tannoy. Girls very pleasant at check in. Nice enough flight, brought own food and entertainment. Return leg quite pleasant and received the standard service. Italian crew on both legs, quite rude and brisque. Not bad for 180 euros.
## 1059 Ticket really cheap: 50 euros. Thessaloniki - Napoli and back, paid three months in advance. Only hand luggage: I had weighed it and I was sure that it was under the 10 kilos limit. It was tagged at the gate and taken from me to be put underneath because we hadn't pay for priority boarding, I had read the new terms and conditions, so I was prepared, though it is rather ridiculous to carry it all through the airport. I was allocated in 9F and my husband at 33F but we didn't pay the 4 euros to be allocated together. Airplane was safe, departure and arrival time were on time. We will choose again Ryanair, because we like: safety, accuracy, reliability and of course low prices. We don't like its policy to ask you for money for all other things, but Ryanair is not Emirates after all .
## 1060 Friday flight Stansted to Dublin. Given a ten minute delay notice but despite that loaded on quickly and departed on time. No fuss with clients and baggage all very slick. Flight passed quickly and landed half an hour early. Very efficient. No problem with people and their seats. It seems if they wanted to sit together they paid the relevant price or if they werent bothered took what was allocated. Much the same as any other airline. 10/10. Dont know what the moaning is about.
## 1061 Ryanair is the world's worst airline. Flew Faro to Bristol. Disorganised, poor customer service, frequent delays and cancellations. I paid for priority and fast track. Did not receive this service. \302\243160 for a name change. Absolute rip off. They can't organise a simple holiday planner. Avoid at all cost. They are cheap but it will cost you more stress and a lot more money in the long run. Our flight was delayed for over an hour. No reason or explination given. Treated like animals at the airport. Easy jet and flybe are much more reliable and professional. I am a frequent traveller and avoid them at all costs now. I prefer to pay more to travel than fly with his shambles of an airline.
## 1062 On October 18th I booked a flight with Ryanair from Stansted to Prague on November 7th returning November 9th. On October 21st, I received an email claiming that my payment was declined, that my booking has been CANCELLED and that in order to take the flight, I would have to rebook on ryanair.com. A few days ago, I received an email saying that I had to "check in" for my flight online, a flight that was supposedly "cancelled". I talked to support for almost an hour, and they're still talking to me while I type this review because they're claiming that after the booking was "cancelled" they tried my card several more times until it was successful. Now that would have been perfectly fine if I was told that my card was continuously being tried as the payment method; or I was told when my card worked and that I would have been charged the money. In either of those cases I would not have spent more money in order to buy a new ticket from a different airline. Support also claimed that they have "no cancellation policy" - which is not even the situation right now. I'm only looking for a refund on the ticket that was presumably "cancelled" which still charged my credit card - which they say they "cannot do anything about". I know the price is very appealing to people, that's why I decided to give them a chance, however I can say clearly now that they aren't worth it. Spend an extra 50 bucks on a decent airline before wasting your money here.
## 1063 East Midlands to Dublin. Approaching my flight I followed the instructions to board and someone tagged my hand luggage bag after viewing my boarding card with no explanation. I thought this was a mistake so I removed the tag and then was confronted when boarding the plane by two confrontational girls asking me why i removed it. I explained that I didn't want it putting in hold as it had stuff in a needed as hand luggage and was in a rush when arriving in Dublin, they were rude and and told me I didn't have a choice. This is not acceptable if I wanted my luggage in hold I'd of booked it in hold. That's the whole point of having hand luggage, you have it with you. Poor service, rude staff and diabolical attitude.
## 1064 Everything went well. The flight was on time departing and arrived 10 minutes early. Ground staff and flight crew were all charming. Flight almost full and several cabin bags ended up in the hold, but all passengers affected seemed to be content about the arrangement as they did not have to pay extra. Most noticeable that several passengers also brought more than their cabin bag allowance on board, both in number of bags and in the size of some of them. Some bags removed to the hold were too large for the overhead lockers. I have never yet had any problems with Ryanair, their service or their website. I have always found the website clear and easy to use, and I am not very computer literate. I have used this route with Ryanair ever since it started operating from Stansted to Carcassonne many years ago, and on only two occasions has anything gone wrong, and on both occasions, the weather caused diversion to another local airport. In both cases, busses were laid on within an hour to ferry passengers between the two airports. When I read some of the complaints on this site, I really wonder what is expected of a low cost no frills airline.
## 1065 Shannon to Stansted. Efficient service. Cabin crew friendly and both journeys arrived on time, in fact a few minutes earlier than the advertised time. I booked the priority seats and had a lot of leg room. No complaints. Ryanair does a good job for short haul flights in Europe.
## 1066 Roma to Madrid. Apart from the fact that i had to pay for one of my check in baggags twice cause i travel with a guitar and they are strict about their oversize policies (beware guitarists Ryanair is the only airline that is so strict and petty for that matter about oversize luggage - okay it is the policy, granted, but when the flight turns out to be chaotic, overcrowded, staff must be overworked or dissatisfied in general, because a smile is the last thing you are greeted with, and the flight turns out to be so full that your hand luggage ends up being checked in at the gate. You get the feeling like they are strict only about matters that are in Ryanair's interest, such as those that translate into revenues, because the oversize fee wasn't exactly "lowcost" - it was almost the same price as the flight. All luggage costs in total were the same as what I paid for the flight, so i paid double. So much for lowcost. I felt ripped off and also felt the underlying greedy vibe of a company that only uses the "lowcost" label as a means to market and boost their brand. The only thing low about this company is friendliness, legroom. Also seems like it targets business people with briefcases, or it sets out to favour these, rather than guitarists, surfers etc travelling the world. Wont be fooled by their flashing marketing campaigns with apparently low prices again.
## 1067 Whenever you are considering to book a ticket with Ryanair consider that if you are willing to retain your sanity you need to pay twice the initial price. We paid 240\302\243 for two tickets from Palermo to Stansted. The total cost doubled when we had to pay seat allocation with extra leg room (since we're not 12 year old), bags, train tickets to Stansted plus a taxi to central London since the flight arrived very late. Terrible service, queuing up for 30 minutes before departure etc. Last time flying Ryanair for sure.
## 1068 Flew from Bristol to Palma. Completely shocking behaviour, sooner that Ryanair go out of business the better. Couldn\342\200\231t even sit next to my wife and checking in way before although forced to pay more. All cabin staff were on about when selling perfumes etc was that they wanted to meet their targets. No one seems to care less about customers.
## 1069 Glasgow to Lisbon. 11 hours waiting on a delay without any explanation in Glasgow airport, please avoid this airline at all cost. Customer services are rude, useless and have not providing any information at all rather than delay the flight.
## 1070 From the plastic seats, lottery tickets and cheap perfume, to them forcing me to check in my bag, this is a bad airline even by low cost standards. I will avoid if there are other options.
## 1071 I flew with Ryanair from Gatwick to Belfast return with my friend on the 19th October 2017. Both times when we checked in we have been allocated separate seats even though the plane wasn't at its full capacity. Both me and my friend had a free seat next to us. When I did the check in online I couldn't select my own seat as I used to be able to do even though there was a free seat next to me. I had to pay extra just to sit next to my friend. They just don't know how to extract more and more money out of their customers. Also this year one of my flights has been cancelled because Ryanair did not have enough pilots. Their service is getting worse and worse!
## 1072 My two friends and I were very unlucky to fly with Ryanair during the mass strike in France this October. We were supposed to fly from Alicante to Kaunas on the 10th of October, but when we arrived to the airport it appeared that our flight was delayed. We waited for ages, then they put us to the plane, where we waited further. Then they returned us back to the airport and said that our flight was canceled due to the strike in France. Not delayed but canceled! Now we only had the option of getting back our money (which was ridiculous, since with this little money we could not possibly buy a flight with another company) or waiting while Ryanair offers us something else. We chose the last variant since we are pensioners and don't have spare money, and we especially chose Ryanair because they offer the lowest prices. We stood in the biggest queue for the whole night! Thank goodness there were 3 of us and we could substitute one another. Throughout the night Ryanair never offered us even a bottle of water! When it was finally our turn to apply for a change of flight, Ryanair offered us a flight for the 18th October! They were only were willing to pay for one night's stay for us (and this chance had already passed since that was the night we spent in the queue). How we were supposed to live until the 18th October in a foreign country apparently did not concern them. Since we needed to go to Kaunas (Lithuania) we finally managed to board a plane going to Poznan (Poland) which was the closest destination to Kaunas and flew with it. I must say that Ryanair behaved so unprofessionally through the whole situation. Not to offer water to the passengers was the last drop really. I doubt I will ever use this low-cost company again, thank goodness there are other options these days.
## 1073 Stansted to Hamburg. I booked a flight with Ryanair to go see my girlfriend, within 10 seconds of paying for my flight I realised I booked the wrong date. At this point I had just paid \302\24375 for a flight I didn't need, thinking I might be able to change flights, I called Ryanair and asked for my flight to be changed. I called and spoke to a lovely girl and great at customer handling, I asked if she could change my flight so that I could fly the weekend before the week I booked. She looked at the flights and said as I'm in the 24 hour period I wont be charged, Great, she did say that the flights I booked totalled \302\24366 so I would be losing out on \302\2439, a bit annoying but not end of the world. How wrong was I, apparently Ryanair have a policy that if you need to re-book the flight, you will get charged or not is not done on the total cost of the flights, but on the individual costings of each flight and compared with the flight you originally booked. So I looked at the flights and yes my flight there was in fact more expensive than the flight there for thew following weekend, then I look at the flight back and the new flight back is \302\24325 more expensive, so I now not only lost \302\24310 on the total cost change going from my original flight to the new flight I have now lost another \302\24325 because I want to change the flight. So Ryanair have now got an extra \302\24330 out of my 10 second mishap, one mistake I shall never make again, I will never fly with Ryanair again. Ryanair are stingy when it comes to releasing cash, they have changed flight times for 3+ flight of mine in the past. Very disappointing, I never write reviews but I had to make an exception, as Ryanair have really let me down.
## 1074 I recently flew Stansted to Dublin, and shortly due to fly from Dublin to Venice. I hate Ryanair. They completely avoided my repeated attempts to contact them for being overcharged and then an agent simply hung up on me while discussing the issue. They obviously don't care. And it is extremely difficult to get a hold of them by any means. Only plus side (so far), is the flight attendants were agreeable people. I think I'd rather pay more and know I'll be treated properly.
## 1075 Barcelona to Rome. Flew with Ryanair twice. Once from England to Spain and then from Spain to Italy. I was a bit worried knowing they are a no frills budget airline. Both flights were only two hours and very comfortable. Staff were friendly. Great value for money. I would fly with them again.
## 1076 Glasgow to Sofia. My flight was delayed for 3hrs, I was stuck at the airport and waited. By the time I got to my destination, Sofia it was past midnight. Metro has stopped running, the only way to get into the city centre was via taxi. Since I\342\200\231m a budget traveler, I didn\342\200\231t want to waste money on the taxi, so I decided to sleep at the airport and wasted the money for the night of hostel I booked. A day or 2 after, I got an email about flight delays, and only just found out that there was an EU law that any flight delays for 3 hrs and more, the customer is entitled to a claim. I immediately submitted the claim. About a week later, Ryanair rejected my claim, saying my delay was under 3 hrs! Well, the flight was delayed 3 hrs exactly, we didn\342\200\231t board until 3 hrs later, but it could have landed less than 3 hrs later, which I wouldn\342\200\231t know, because I didn\342\200\231t check the exact time I landed, it could be about 2hr 50min later than expected in Sofia. Ryanair also said, any flights that are delayed more than 1.5hr, customers are entitled to claim back expenses during the wait at the airport, providing receipts are provided. At the same time, they closed my case. I took this as a complaint, I asked for the exact time it landed in Sofia; asked for the reason of the delay; explained due to the delay, I lost a night at the hostel, and had to explain to them that I had to sleep at the airport; and why no one informed us there would be spending expenses for delays over 1.5hr? When I got a reply from Ryanair, the staff was not even answering any of my questions, he just repeated the same thing as the first person said, told me to submit any receipts. Also that the flight was delayed for less than 3 hrs, so I was entitled to the 3hr+ claim. I tried again, explaining this further, but once again, it was no use. They were not doing anything about it. I just wanted to warn anyone flying around Europe, if there\342\200\231re any delays, make sure you check the time, and make a record of it if possible. You can always get it from the website afterwards and save a record for it, if you need any claims. If it\342\200\231s delayed for less than 3 hrs, check the airline\342\200\231s policy and see what you\342\200\231re entitled to. Because obviously they would not just tell you the freebies you could be entitled to, to save their cost! Anyway, Ryanair service is bad, all the emails I had with them back and forth, they were terrible. A different staff reply to my email every time, just repeating the same things over and over again, and not answering to my questions. Up until now, I still have no idea what caused the delay, or the exact time the flight landed.
## 1077 Dublin to Stansted. I am not sure there are actually words within the English language to describe how terrible the service this airline provides. They treat their customers like livestock. In fact even livestock do not get treated like this. They cannot even tell the truth regarding what is the situation when things go wrong and have no compassion for human comforts and necessities. I honestly don't know how they continue to thrive in a world where we should be showing corporate responsibility.
## 1078 Manchester to Alicante, \302\243110 per person return flights with hand luggage. If we wanted hold luggage, it was a further \302\24390pp outbound and \302\24380pp inbound. Outbound flight, my hand luggage had to be placed in the hold because apparently only 90 bags are allowed in the cabin. There was plenty space for many other bags in the cabin - strange procedure. Outbound flight staff were rude. Didn\342\200\231t smile. Were not polite and too busy flirting and handing out their number to a group of lads rather than dealing with their other customers. Money making scam! We would have had to pay a further \302\24327pp on both outbound and inbound to sit together. Inbound flight I was row 31 (very back) and my boyfriend was row 3 (front). What would happen if there was a potential emergency? All you would want is to be close to your loved ones or the people you have come away with. Instead I was sat in the middle and amongst a group of people who didn\342\200\231t know each other. You get what you pay for. Yes, but I didn\342\200\231t pay a total sum of \302\243220 for terrible customer service, real life tinder or to be sat amongst strangers! Absolutely nothing good to say about Ryanair - will be avoiding this airline in the future.
## 1079 We were told half an hour before we landed that we are goint to Trieste as fog was stopping planes to land in Zadar. After we were dumped at the airport no one from ryanair contaced us the passingers to let us know what was happening also no food or water was offered.
## 1080 I booked the flights with Ryanair months ago on the basis of price and appropriate dates, only to have the goalposts moved later, so that I needed to pay for seats in order to ensure that my wife and I sat together. Later still, the cancellation farrago threw the whole holiday into doubt until Ryanair was forced to publish the lists of flights affected and we learned that our flights were still on. Then the day before we flew we received an email warning of a ban on carrying alcohol into the cabin and telling us what would happen to any alcohol bought in the "duty-free" shops. This did not affect us directly as we never buy any "duty-free" but we did wonder whether the flight was going to be full of hen and stag parties. By then, any faith we might have had in Ryanair was pretty well dispelled and we had no high hopes of the flights themselves. In the event everything went fairly smoothly. Boarding for the outward flight was handled efficiently by a single agent while the cabin crew were both pleasant and hardworking. The cabin manager, in particular, carried out her duties very responsibly (for example, not starting the safety demonstration until she was sure that she had the attention of practically everyone on board) but with good humour. There was some changing of seats before we departed, but we were only a few minutes late rolling back. We arrived early (cue the awful triumphal blast) after an uneventful journey. For the return flight, boarding was slightly delayed though it did not impact upon our actual departure time. The cabin crew again worked hard but it was difficult to hear any of their announcements, due to the speed with which they were made plus the conversation level within the cabin. The actual flight was equally uneventful and we arrived marginally early, so we had the trumpet blast again, which this time was greeted by ironic cheers. After all the various alarms beforehand, therefore, we made it there and back without any real bother, but my wife and I have still decided that we will do our best to avoid Ryanair in the future. How can you trust a company that changes the rules after you have booked, yet denies it has done so, or cancels flights on a whim and tries to wriggle out of any of the consequences? My overall rating here therefore balances out the pluses of the actual flights against the minuses of the doubts and uncertainties beforehand.
## 1081 Liverpool to Dublin. My partner and myself flew to Dublin for a day out. After going through the booking system online and reading some of the reviews online we were not looking forward to the flight. The booking system is quite obviously setup to seat people as far apart as possible so the priority seating charge can be applied to sit together, this method leaves you with a feeling of being ripped off, a fact born out in most reviews we read. I personally would prefer the \302\2433 to be automatically applied to the fare with an option to be randomly seated for \302\2433 less, this would leave you feeling you had a bargain instead and cut down complaints and as most people prefer to travel together the airline would probably make more from it and everyone would be happy. We recieved 3 reminder emails from ryanair prompting us to check in online and avoid the airport checkin charge which was good. We were pleasantly surprised by the flights, both journeys were on time and even landed ahead of schedule. The planes were clean and looked new and the staff were proffessional and curtious. At dublin after dropping our hire car we underestimated the time it would take to get through security as it was very busy and by the time we got through our gate was closed. After a mad run the full length of terminal 1 we got to the gate 10 minutes before take off with the gate deserted. However after jumping up and down and waving to the pilots who we could see through the windows, he instructed one of the ground crew to come and get us and bring us to the plane, cant thank him enough. We had a pleasant flight back and based on our experience would book with this airline again.
## 1082 Flew London to Bucharest. A stag party of young men wearing fancy dress as superheroes was on board. They spent the flight shouting, jumping up and down and playing dance music over a loud speaker. The cabin crew did their best but it was pretty bad and I wonder if better training might have helped. The return from Bucharest was uneventful. These days, I pick Ryanair over the degraded BA but I wish Ryanair would improve the food and drink they sell on board.
## 1083 Was on a Ryanair flight today from East Midlands to Bergerac. About 40 mins before landing a lady was taken ill with what seemed to be a serious illness, I can't praise the cabin crew enough about how they handled the situation, they were calm quick and reassuring in the actions they took. I have booked over a thousand single flights for my family over the last 10 years and have never encountered any problems that have been caused by themselves.
## 1084 Paris to Porto. Even if you want to save money- in the end you spend more. From Paris the flights go from an airport that takes 2 hours to get to. They don't mention you have to book on line to avoid a 50 Euro tax at the airport. They are tight with baggage and they aren't around when you need them. Spend $50 more and get a nice flight in a convenient location, or even better don't spend more and still get a better flight. I never rate things online, but this experience forced me to
## 1085 I wanted an affordable plane ticket for a 2-hour flight from Ibiza to Malaga, and I came across Ryanair. The prices displayed in their or a booking website is just the price of the booking, you also need to pay for your luggage, seat, and online check-in afterwards at a hefty cost that they do not mention before you've made the purchase. Their staff was one of the most uncooperative and unprofessional I have come across, I very politely confronted one of their staff member regarding the luggage cost, and her response was "do you want your bags shipped or not?". I personally found it extremely shocking and disappointing.
## 1086 Liverpool to Prague. Booked with Ryanair despite all the recent bad publicity and were lucky to not have our flights cancelled. Thought we had paid for seats next to each other on the flight out but the transaction mustn't have completed as I ended up in seat 8d and my husband was sat in 32d. Rather a dramatic difference, but then I suppose that is how they rinse you of more money! I'd come to terms with not taking a suitcase for a whopping \302\24380 return, so I had squashed my stuff into a little hand suitcase and was happy with the fact you had no waiting time at the other end for your case. Unfortunately, as we got to the gate to board the plane, I was told my little case was to go into the hold for free as there were now more than 90 passengers with hand luggage! But it didn't get whisked off by a memeber of staff, oh no, I had to carry it down the steps, and put the thing on the suitcase truck myself! Once aboard the plane and once we realised that our seats were at the other end of the plane, I sat down in my seat and crossed my fingers for a good flight out in between all the stag and hen dos shouting to one another as none of them were sat next to each other either! Makes sense that doesn't it! So we set off on time and the cabin crew have to ask 4 times for everyone to shut up while they carry out the safety demonstration. Four times they got ignored! Throughout the flight, the toilet queue was always 10 people deep, the cabin crew were abused left right and centre by the passengers but eventually we landed safely. Peeved that I had to the stand in another queue waiting for my suitcase, having purposely not spend \302\24380 for the pleasure of not having to wait for it, we stood waiting for 10mins to pick it up. The flight home was much quieter, much smoother and minus so many hen and stags. We paid the extra \302\2434.08 for my husband to sit in front of me and someone kindly offered to swap so we could sit together. I was able to take my little case on board and we all made it home in one piece. I am grateful that our flight wasn't cancelled and I appreciate that the unpleasant flight out was due to the passengers and not the staff. However, I will not be flying with Ryanair again.
## 1087 Edinburgh to Faro. As usual, Ryanair staff show no professionalism, no communication, not to mention appalling service. Passengers stood waiting for 1 hour in a queue to board, no explanation (but 5 members of Ryanair staff chatting and joking in front of an increasingly angry crowd). When will they learn, we understand that some issues are outside their personal control, but not telling us what's happening while elderly and children become increasingly distressed. As previous encounters, another 1* flight.
## 1088 Venice to Eindhoven. This is about the transfer service they offer on their website. They allowed me to purchase a transfer from Piazza Roma to the airport 24 hrs before the flight. I then get an email that says the transfer is not confirmed and I'm responsible for contacting this sos email. I did this and gave them the info they asked for. Ultimately, I had to buy another transfer directly from the bus company, which was cheaper anyway. I asked for a refund. They are giving me a transfer credit for one year. The likelihood of using it is very low. They know this I'm sure. Why would they allow a customer to buy a transfer that cannot be confirmed? I will not be using Ryanair transfer services or any other extra service. And I will choose any other airline if I can.
## 1089 Glasgow to Dublin. Absolutely horrifically awful. We got some warnings on this airline, and I wish I had heeded them. It's true that they have the best price initially, but they have so many hidden costs it's obscene and I really feel strongly that a reputable airline is the way to go. I will never fly with Ryanair again. The staff member we met to check in was the rudest person I had ever dealt with in customer service - I don't even know how to describe it, the whole interaction left me in a very sour mood - she informed us that because we had not done the online checkin two hours before our flight (we were standing in front her 1 hour and 45 minutes before our flight, without exaggeration), we now had to pay \302\243100 to have her check us in. This was more than both our tickets combined. It was 6:30 in the morning, and we were the only ones there. I couldn't believe it. The next lady we spoke to who was charging us this fee advised that we had 'checked our email wrong' since there should have been a reminder (there wasn't- I went back and checked, even the junk box). The booking email does mention this fee at the end of the page. If this airline wants to save money by limiting staff and doing things online, I support that - but I should have still been able to check in myself then at that time - to cut off the online checkin 2 hours before and charge a ridiculous fee at that time is just shady, wrong and I felt so angry. They already have additional costs for everything - we had paid to check our bags, and we had paid extra for 'priority' seating so our seats were already reserved - so why would we check in??? So angry and disappointed. The worst part is, this airline clearly does not care about what their customers think, and that makes the customer totally powerless to ensure that the service they're receiving is fair, and this case it's not. I hope this airline does not continue to be supported, and I reiterate my strong recommendation to go with another airline.
## 1090 Rome to Krakow. I had good luck and my trip was not cancelled, but I was surprized how Ryanair prices have lost transparency compared to some time ago, now you have to pay a lot for many things that previously were free or cost much less. I chose a flight for 86 Euro round trip, and ended up paying 170 Euros. A registred baggage of 15 kg now costs 35 Euro (compared to 15 not so much time ago), if you want to sit near a person you travel together with you have to pay (previously persons checking in together were placed beside each others). Even web check-in is not free if you do it more than 4 days before the trip (previously it was). For the rest, nothing new: usual low-cost service, little room for legs, but at least it was something I knew about in advance.
## 1091 Flew Palma to Bournemouth. The airline is a rip off! It seated us in two seats nowhere near each other. Then when we ordered seats beside one another they had the audacity to charge us \302\24322. Why did they not sit us next to each other in the first place if those seats are available? They strategically placed us so both seats had to be moved. Why would I go on holiday with my partner not to be able to sit next to him? I will never fly Ryanair again!
## 1092 Hamburg to Manchester delayed by 45 mins. Every time I'm flying with Ryanair it's late and things are very unorganised. Very disappointed for one more time. Not even worth the cheap flights.
## 1093 This is not about a flight it is about the superb way Ryanair customer services handled our forced cancellation of a flight from Pisa to Brindisi. My mother died and they handled the cancellation efficiently and refunded the costs in a very timely manner, full marks to them.
## 1094 Flew Ryanair from Corfu to Stansted. Flight was delayed over one hour, passengers told to start queuing at least an hour before boarding. Predominantly elderly forced to stand for this time. Further queue on tarmac as aircraft not ready. 'Speedy boarders' ended up boarding after those rushed through a second departure gate and onto the first transit bus. So that was a waste of money. This was not a cheap flight, booked because of timing of departure.
## 1095 Stansted to Riga. If you do not pay to choose your seats they make sure you are separated from people in your party. They do this so that you pay extra. But I really hope people don't pay as this is typical of the management at Ryanair. In flight from stansted to Riga the cabin crew announced that the the money from the scratch cards goes to charity. The priority boarding was funny from Riga to Stansted - they let both queues in at the same time - can you imagine paying to be let onto the plane at the same time. We all know they are cheap and therefore popular, but you are the worst household brand and my least favourite airline.
## 1096 Edinburgh to Stansted. If you are looking to fly low cost with your family avoid Ryanair. They will give separated seats to all members of your family and then if you want to stay together you would need to pay for the seats which could add up to a lot of money.
## 1097 Cologne Bonn to Rome Ciampino. Business as usual: flight on time, little leg space, no entertainment or service, but I did not expect any. I would also say that Ryanair has lessened its aggressive marketing strategies of its first times, when during a 2-hour flight passengers were interrupted several times trying to sell them something.
## 1098 Dublin to Amsterdam. Significant delays experienced on both legs of our journey - 2 hours on the way out which seriously interfered with our plans, including a very uncomfortable 45 minutes sitting on a packed plane on the runway, and 2.5 hours on the return journey. Updated announcements for both delays were fed out incrementally every 10-15 minutes, when we could clearly see that the plane was still on the tarmac at the other end and had no hope of reaching AMS/ DUB for at least 90 minutes. To top it off, once on board, it was announced that the Captain was "negotiating with ATC" but with no success, when in reality the Ryanair aircraft on this route had missed their time slot earlier in the day resulting in each subsequent flight being pushed back. The staff on the return flight looked really weary but were troopers and delivered good service. Aircraft on both legs were untidy with detritus from previous passengers. Thankfully we had paid for priority boarding and seats and so apart from the inconvenience, were somewhat insulated from the full brunt.
## 1099 Manchester to Fuerteventura. I paid an additional \302\24326 to sit next to my wife only to find they had split us up again. I contacted Ryanair only to be told they were a non refund company and that my only option was to cancel the flight or sit in our seats. We had delays both sides, the cabin staff wouldn't take litter off anyone until the end of the flight. I know not all airlines provide complimentary food but I think \302\24313 is ridiculous for a rubbish toasty and a water. It was 4.5 hour flight that was delayed you would think there would be something. Overall, myself and others we met at the airport have all said we won't be flying with Ryanair again. My advice is fork out a few extra quid and not have the first last part of your holiday ruined.
## 1100 Gdansk to Bristol. Having never flown with Ryanair before I assumed it would be similar to other budget airlines I have flown with in the past. I was shocked at the filth I had to sit in on the flight. The seats and carpets were covered in crumbs and all sorts of rubbish. I pulled down the table to discover it was encrusted with food from previous customers, and absolutely disgusting. I will never fly with Ryanair again. They charge premium prices for the lowest service. I'm sticking with easyjet.
## 1101 Rome to Budapest. One of those airlines that charge very low price but take every penny out of you they can. I travelled with Ryanair before and this time they made me pay \342\202\25450 for "oversized" bag, because the type of material my luggage was made (hard Samsonite ones) didn't go through the side size of the measurement compartment they had. I saw the same bag inside the airplane with no "oversized" ticket on them. I hate this lack of pattern the company puts to get the money out of its clients for non rational reasons, as the staff could see that my bag would fit into the measurements but the material wasn't made to be soft or squishy. Seriously, will avoid this airline from now on.
## 1102 Dublin to Manchester. Would just like to say this is first time of being on a flight that nuts are not allowed. My partner didn't come with us but has a nut allergy and I hope other airlines would follow suit when necessary. Even though only a short flight everything ok. Wasn't happy about my bag ending up in hold on way home as had to wait ages at carousel for it but overall very good.
## 1103 Before August I had never flown with Ryanair because of all the awful reviews I'd heard. However, planning a last minute trip to Barcelona with other low cost airlines proved tricky due to flight times so I bit the bullet and booked with Ryanair. I shouldn't have worried as I really couldn't fault the airline. My boyfriend and I flew out of Liverpool to Barcelona and home again, with great ease. Boarding was simple, as we downloaded our boarding passes to our phones (as we always do whenever we fly, so much easier!). We didn't have luggage to check in so can't comment on that but sailed through boarding easily and were delayed slightly before take off (20 mins or so) once on the plane but it's August summer holidays so to be expected! Staff were all super friendly and very quick coming round with the food and drinks trolley. Yes the food and drinks are expensive in general, and in comparison to other airlines. However, if you have a massive problem with the prices they charge then bring your own food on or just wait until you reach the airport at the other end to eat. Seats are not super comfortable or luxurious but they're decent enough for a short haul flight, and you get what you pay for. Overall would definitely fly with them again.
## 1104 Faro to East Midlands. We have 5 people in our party all with hand luggage we've just been told they have to go under the plane in the hold. Got on the plane to find out that there was more than enough room in the over head lockers. The worst thing is the fact we have a 4 year old boy with us who obviously wants to be sat next to his mum they've gave him a seat one side of the isle and his mum a seat the other side. The other 3 passangers which would of liked to be sat together got put in random places on the plane one back one middle and one at the front which I find really annoying because they could put you together but just want more money from you. I will not fly with them because of this reason!
## 1105 Knock - Stansted 15th August with Ryanair. To be honest couldn't really fault the airline, get what you pay for. The only issue was boarding, it was pouring rain and we were sent out to board the aircraft and reached the aircraft steps to find the crew were not ready and were sent back into the terminal and just as we reached terminal door we were turned around again to board, got soaked in the process. The on board crew were actually very nice and it was a training flight with additional cabin crew members. Purchased three new "breakfast burrito" on board and in fairness it was lovely, aircraft was "well worn" and not the cleanest but short hop it was fine. I purchased my seat and I did not have any of the seating issues as mentioned in other reviews, they also tagged my hand luggage as I volountered as it saved me carrying it on board.
## 1106 Stansted - Agadir, 15th August. Had to fly this route as there are no longer any direct flights from Dublin until the winter, flight was fine, boring for almost 4 hours - that's nobody's fault. Crew were great under a very good cabin supervisor who was Polish and I felt sorry for him as people would not take their seats. A lot of angry passengers from what I heard with what appears to be the policy of people getting separated under the automatic seat selection process, but if you area paying a low fare why not pay the the extra \302\2434 or \302\2435 to sit together? It's not the end of the world. Cabin service was good, they went around plenty of times with the trolley, as this was Agadir they were also selling alchohol at very reasonable prices. All the Ryanair cabins I've flown in lately seem the worst for wear, hardly surprising as they are a very busy airline - no hesitation in using them again.
## 1107 Malaga to Stansted. After paying GBP190, one hour late to boarding. Being taken on a bus to the plane. And drop off next to the gate we have to walk under the rain. Asked for a glass of water for my pill and they tell me they don't have water because they don't have ice to cool down the boiling water - joke or what? They can spare a bottle of water for individual glasses for costumers? Hopefully never again with Ryanair.
## 1108 Luton to Dublin. Ridiculous ticket policy and lower than expected level of service. We couldn't travel next to each other despite having all travellers on one ticket. They had around 80% of seats available however Ryanair's system chose one seat in row 12 and one in 24. Naturally, if you prefer to change your seat number, you have to pay extra for that. The aeroplane was dirtier than usual. Landing in Dublin horrible (in Luton was OK). I think they lost one of their loyal customers after this flight. Check the competition before flying with Ryanair - EasyJet or Wizzair are now my choices.
## 1109 I was flying from Dublin to Budapest with my wife, but this was the last time we fly with Ryanair. We were given 2 middle seats, 5 rows away from each other. The seats beside us on the left and on the right were empty but we were still given the seats 5 rows away from each other, so we had to pay 11\342\202\254 to seat together. Its a shame how Ryanair want to make extra profit, we never experienced something like this, put two people in two diferent seats even if they bought the ticket together and you have lots of seats empty for 2 beside each other.
## 1110 Flew Naples to Manchester with Ryanair. I decided to give this airline another go after a few years of avoiding it. Never again! There's always a problem. It is not worth save the extra \302\24350+. Food is awful, just eat before. Seats terrible, small and uncomfortable. Refused to check in my suitcase although I had booking confirmation that I had already paid. Forced to pay a further \302\24335 to drop my case and told to claim back any bag booked at a later date. Spend the extra money and fly elsewhere!
## 1111 Flew London Stansted to Cologne. Never ever fly Ryanair! They never have any staff on duty to help or book you in on time and the ones they do, genuinely couldn't care less about you and your journey. Shocking customer service. On the outbound flight I arrived 2 hour and 10 mins early and queued in line (after checking in online the day before) to check my bag. They had only a few members of staff and failed to book us all onto the flight because of lack of staff. I missed my flight. I then had to queue in the customer service line for 2 hours and the response was awful. I was told I had to pay another \302\243100 to be reboarded three days later. Apparently it was mine and my fellow stranded passengers fault we missed the plane (the plane that left half empty, according to my colleagues who were onboard who didn't have to check the company gear). I had to find and pay for another flight to join my colleagues online for the conference (for which, you will recall, I had the gear). Oh and did I mention that they lost my passport at the outset when they randomly checked it. My return flight was no better even with priority booking (oh yes, don't be fooled that means nothing!) they took my hand luggage away because the flight was full, meaning I couldn't do my work and then the flight was delayed by an hour and 20 mins. And guess what!? There was no one to talk to from Ryanair! Awful!
## 1112 Catania to Milano. It was the first time I flew with Ryanair, I traveled with my family from Catania to Milan. We were very pleased with the on-board staff, cleanliness and above all the punctuality. I would definitely recommend this company to other people. E^ stata la prima volta che ho volato con Ryanair,ho viaggiato con tutta la mia famiglia da Catania a Milanoi. Ci siamo trovati molto bene, dal personale di bordo,la pulizia e sopratutto la puntualit\303\240.Sicuramente consiglierei di usare questa compagnia ad altre persone
## 1113 Wroclaw to Warsaw. The flight experience was overall quite good. We checked in a day before the flight and it turned out that although we had our seats assigned in two diffrent parts of the airplane, we were seated in extra legroom seats (1, 2 and 16 row) and that was a pleasant surprise. I really despise the Ryanair\342\200\231s boardnig procedure \342\200\223 the gate opens before even the airplane finishes its previous rotation. It causes a necessity of waiting in the bus which drives you to the aircraft for a long time (up to 15 mins even on a domestic flight). The cabin was not fresh but despite that, it was quite clean. The flight was smooth and everything went without delay. The thing that made me uncomfortable onboard was the air in the cabin \342\200\223 it smelled as if it was really polluted which made me difficult to breathe. What is more, it seemed like the cabin crew\342\200\230s only duty was to sell food/scratchcards/duty free products to the \342\200\230customers\342\200\230. They didn\342\200\231t really care about passenger safety and comfort (some safety announcements were only made in Polish). To conclude, I really appreciate the effort, Ryanair puts in providing low fares and on-time flights but still, they should improve some parts of their service.
## 1114 Dublin to Rome and Dublin to Barcelona a few weeks before. Barcelona flight a lovely new aircraft and nice srrvice from very polite crew. T1 is a disaster and the queue nearly went up the escalator. Dublin to Rome also a good flight and oddly we had the same staff member on both flights who was courteous and professional. Ryanair has really improved in the last few years and I would be happy to travel again.
## 1115 Flew Ryanair from Naples to Barcelona. Lined up at the Gate only to wait for over an hour. No explanation as to what was causing the delay. When we got on board we were told the previous crew had gone home and they had to find a backup. Plane was very old and uncomfortable. No seat recline? Bought some inflight drinks and couldn't use credit card as it wasn't European. Had to wait another hour for bags at the destination but not sure if that's the airline's fault. In the end arrived over 2.5 hours late.
## 1116 My longest Ryanair sector so far, considering I have flown many times with them before. If you play by the rules, and do as they say you get a cheap flight that's usually comfortable and on time. Using Stansted for this, the gate was far away from the terminal which is fine. Having bought priority boarding, I was one of the first to board but somehow that doesn't matter, just be at the front of the regular queue and you'll save a few quid in the process. Only 90 carry on's can be placed in the overhead locker so I asked for mine to be placed in the hold, gate staff are more often than not happy to assist in that matter when they are asked. Bag tag goes on and I left my suitcase with a baggage handler. Onboard the aircraft was with the old Ryanair cabin on one of their oldest Boeing 737-800 although, she didn't look it. The majority of the Ryanair fleet have the older, more padded seats in a 189Y configuration so good if you're a little larger, like myself. The newer in the fleet with the Boeing Sky Interior have the lighter-weight seating which has far less padding but more legspace although I cannot vouch for that. The seat was comfortable and legspace was okay although another inch would of been beneficial for all 6" of me. Crew attentive as always passing through the cabin twice on this three hour flight providing a refreshments service which I find to be overpriced so buy before hand in the airport where you'll save money. Crew also passed through the cabin with some perfumes, electronic items and the famous Ryanair scratchcard. Onboard was rather warm but the flight was near enough full so that's to be expected. A comfortable crossing. A smooth landing into Sofia and we parked on a remote stand. Bussed to the terminal on a sweltering old bus into Terminal 2, the better of the two terminals. Ryanair being one of the few low cost carriers to use Terminal 2. Passport control was smooth with border police just visually checking my passport while there was a short delay with getting my bag on the carousel. Returning was a similar affair. The gate staff at Sofia look for oversize bags at the gate so please be warned in carrying oversized bags not to the restrictions. They were also checking for oversized second carry on bags too. I asked for my suitcase to be placed in the hold which the obliged. The flight was delayed 40 minutes due to a delay with the inbound aircraft; something that does happen from time to time with the last flights of the day with Ryanair. I slept for most of the flight home onboard a full flight. Air-conditioning was on although it was rather warm onboard and I slept comfortably for such a small space. A quick left hand turn onto short finals ensured a smooth landing into London Stansted. Parked on a remote stand again and was bussed on an old London bendy bus to the terminal where my bag was waiting on the carousel. If you do as your told and play by the rules, you will get a cheap flight. Book ahead in advance and it will be cheap too. If wanting to travel with luggage, the daily BA offering from London Heathrow might be a cheaper option when travel to airport costs are included. Yet another happy Ryanair experience which has certainly got better in the last few years.
## 1117 This was a very early morning flight from Madrid to Toulouse. I was able to check-in online and found the bag-drop to be efficient and reasonably quick too. There was quite a long wait at the departure gate and this is where things were poorly managed. Boarding was not well organised at all. The cabin crew were welcoming and undertook the safety demonstration in a professional manner. I found the crew to be hardworking and very approachable. The flight left on time and arrived promptly. The interior of the flight was clean and rather spartan. I had not used Ryanair in years but this overall positive experience has made me consider them for future trips.
## 1118 Manchester to Madrid. A lot of people rubbish Ryanair, but if you follow their requirements you should have a great flight. If you want to be sat next to someone pay for it. Check in as early as possible, use their app. If you want to board early buy the appropriate fare. Arrived 2.5 hours before departure at T3 Manchester to check bags. The Ryanair section was unbelievably busy considering it was 3.45am. However, the line of about 300 people was processed efficiently within 20 minutes. Boarded on time and welcomed by very affable crew. Aircraft had new sky interior and seats which make a huge difference. Plane clean too. Departed on time and crew did usual BOB/scratch card/duty free service. Landed on time in Madrid. The cost \302\243180 for two travellers with a leisure plus ticket( priority boarding, seat selection and 20kg baggage allowance each). Remarkable value. Definitely use them again.
## 1119 Birmingham to Malaga. Shocking service. In the airport the displays went from showing the gate number to final boarding with 2 minutes, they rushed everyone onto the plane making people leave behind drinks that had been purchased. Once on the plane captain announced that they were missing vital paperwork and do we could not take off. After 45 minutes the captain said that the drinks trolley would be coming round if anyone wanted to buy a drink. The plane was very hot and staff unhelpful. When paperwork arrived we were then told there was no flight window and so had to wait another 35 minutes. But they kept the seatbelt sign off do passengers could go to the toilets.
## 1120 Flew from Madrid to Rome Ciampino. No frill airline. We checked in several days ago. The Ryanair counter at Madrid airport was crowded but line was moving quickly. All bags checked without any issue. We also bought priority boarding which was a perk really. Ryanair do not size or weigh carry on luggage so it was good for us. Seats were comfortable and good leg room. We had a newer B737-800. I bought coffee on board which was great. The flight was on time. Overall no complaints.
## 1121 Flew Ryanair from Stansted to Rome. Terrible from start to finish. Split up a family of 4. Both ways. With our children both having a spare seat on the way home! The flights were delayed both ways by a total of 3 hours. Priority boarding was longer than normal boarding. We were normal boarding. The plane was too hot, with the air above our heads barely blowing. The seats and floor were dirty, with the seat next to my husband covered in melted chocolate. We were so far apart from each other we couldn't see any other member of our family, even though my children are not yet 18. They are deliberately splitting people up if they refuse to pay the extra to choose seats. So if you leave it to chance you will be guaranteed to sit apart. They never used to do this, so why start now? But please, do not give in or they will win. The staff were heard talking, and they all want to leave and go to other airlines. Heartless, greedy and cheap.
## 1122 One way flight to Paris Beauvais. I paid for a business plus ticket so had priority check in for my luggage which was quick and with no queue. Security check was really quick and efficient. Priority boarding and I had the front row seats with plenty of legroom. Flight arrived on time. The downside was no complimentary snack and drink with business plus and no lounge access. The luggage delivery in Beauvais was quite slow. Fare was not cheap when travelling business plus but overall I was quite happy with Ryanair.
## 1123 Timisoara to Stansted. A star is too much. One of the worst companies to fly with nowadays! They intentionally seat families and group separately with the option to pay extra (another \302\24310-\302\24312) to be seated together. There is no such a thing as customer service with Ryanair! Truly recommend to avoid flying with them!
## 1124 Girona to STansted. Being on beginning of the queue, non- priority, wasn\302\264t allowed to go on board with a small luggage. I complained to the staff and they said that too many people were on priority. they told, me really rude, that next time I had to buy priority if I didn\302\264t want that to happen. When the flight started more than half of the luggage place on board was empty. I asked the stewardess why that happened and he said that wasn\302\264t their problem and give me no help or answer. Will not use or recommend Ryanair ever again.
## 1125 Flew Ryanair from Stockholm to Rome. They charge for seat selection and put you as a family in different seats intentionally to force you to pay up. Never seen any other airline do that. The flight back home was late because the airplane was had still not arrived to the airport! The seats are uncomfortable. In general, a low quality airline.
## 1126 Sofia to Stansted. My first and last flight with this airline. Service was dreadful, cabin crew could not be bothered, serious delay on inbound. They demanded that I must check in my hand luggage which I made sure is within limits but they said that after 90th passenger all luggage must be checked in. The overall service and punctuality was dreadful.
## 1127 Weekend booked with my family, allocated different seats round the plane, asked if we would like to sit together for extra charge. When we got on the plane I was sitting with a family that were scattered round the plane, talked to 2 other family's with the same issue. This would not have annoyed me but I had a free seat beside me, my sisters had free seats beside them and also my mother, so it looks like we were deliberately seated at each ends of the plane. This isn't such an issue today but I will definitely pay extra to fly with another airline when I bring my children.
## 1128 We fly a lot. We have flown with the best, Etihad, Cathay, Singapore Airlines, Emirates etc. We have also flown with many budget airlines around the world. We can now say we have flown with what must be, the worst airline on earth. We were in the middle of a cruise with no internet. We docked at Ibiza and went for a coffee. Whilst there we got internet access and received an email from Ryanair saying if we didn't check in, we could be charged $50 Euro each. To our disbelif, we tried to check in online but at the final stage, we were kicked out of the website. We tried several times. At that time there was a global virus effecting everywhere and our search engine Google was not allowing us to access many websites. We were in the Ryanair website but could not complete the check-in. We eventually gave up and decided to try later. Our next stop was Palma where we departed the ship. As we did not have internet access, we decided to get to the airport early so we could hopefully complete check-in well before the 2 hour window Ryanair gives. We arrived at Palma airport 2 hours and 40 minutes before our flight. We waiting in the check-in queue for around 25 minutes. When we finally were called we explained to the check-in lady that we could not check-in as their website wold not let us complete the checkin the day before. She then went out of her way to try and check us in on our mobile phone. She gave us the thumbs up, but then she must have had the same problem. She tried again but could not check us in on our phone. With 8 minutes before the the 2 hour window, she gave up and said sorry you have 8 minutes good luck. We tried but could not check in on time. Then we went back to the check-in counter and the lady gave us a docket to go to the service counter to pay the $100 Euro ($50 x 2). We walked to the service counter and stood in line for another 15 minutes. We paid $100 Euro because we had no option. When we originally booked this flight, we had other options and wow didn't we regret flying this airline. Whilst waiting in the check-in queue and the service counter queue we heard complaint after complaint about the service/procedures. When we boarded the plane, we saw the seats and could not believe our eyes. The tightest seating I have ever seen, including all the Asian airlines. Scattered crumbs, loose hair and rubbish on just about every seat. I brushed the food off our seat and then thought to take a photo. I wished I took the photo before? When you view the seat photo, the yellow is the head rest of the seat in front. This will show how tight the seats are. The plane looked dirty. As we sat down we heard a lady with a British accent discuss the lack of baggage storage. She had a small bag. The Ryanair stewardess said "bad luck, take your seat". The lady passenger yelled "Typical Ryanair" The photos attached show the condition of the plane. The seating stunk, worn leather. So on top of an extra $100 Euro we flew the longest hour of our lives and were counting the seconds to get off. Thankfully there were no more dramas after we landed. Do not fly this airline. The response from Ryanair was a standard reply and we could tell they did not read our email. Now we can brag about the best airlines and the absolute worst - Ryanair.
## 1129 Memmingen to Dublin. My boyfriend bought me 200 euros worth of Ryanair flight vouchers for my birthday last year. When I tried to use them to purchase a flight, they wouldn't work. I spent hours and a couple of days with customer service trying to get them to work. Over time, flight prices go up, and they were not offering any solutions. They kept blaming my browser, although I had tried it on various computers, phones, and browsers. Ryanair refused to refund the gift vouchers that didn't work and they refused to book the flight for me. Finally, their solution was for me to purchase the flight with my own debit card and then they would refund the money. I did this, and I did not receive a refund until a month later after having to contact them multiple times to get the refund. In the end they did not refund the full price paid with my debit card. The flight I purchased was less than the balance on my gift vouchers, so I should have gotten new vouchers with the remaining balance according to the terms of the gift vouchers. But, the gift vouchers expired during the time it took them to refund my money, so I guess that money is just lost. I have filed a another claim to try to request the full amount be refunded to my debit card and to receive the remaining balance on new gift vouchers, but after the experience I have had with them, I do not expect to ever see it. Flyers beware!
## 1130 Berlin to Stansted. We purchased Ryan Air tickets for this leg of our flight because they had the best price. We bought the tickets several months in advance. Forty-eight hours before the flight I got an email saying that we had to pre-check-in to avoid a 50 Euro additional charge. I used my cell phone to go online and do this, but when I got to the website I went as far as I could with the pre-check-in and thought it was done. I clicked on every button that seemed to advance me to the next part and then came to the end. When we got in line to check in we were told to go to another line where we learned that the pre-check-in never went through, so we had to pay an additional 50 Euros for each ticket. There were also others in the same line who had the same experience. When we finished the trip I wrote to Ryan Air about it and got back a curt letter saying there was nothing wrong with their website, and that they would not reimburse us. I think this is just a super-sneaky way of getting more money out of some customers. So beware!
## 1131 Flew Beauvais, France to Lisbon, Portugal. We followed all the guidelines to save money - printed our own boarding passes and made sure our luggage was allowed in the plane. The ticket was cheap, staff on ground and in the plane were friendly and seats were fine. The plane arrived 20 minutes early at our destination and we had a very positive experience. We used Ryanair again in July to fly to Bari and had another positive experience. Thanks Ryanair for making it affordable to fly and making it a positive experience. We will be back.
## 1132 Berlin to Rome. In future I will avoid this airline at all cost. They charge you a fee if you don't check in online, but arrive to check in at the airport. The fee is so high, \342\202\254100 for a couple in the same booking. That was practically the same price we paid for the tickets.
## 1133 Ryanair is the worst airline. They will literally make you pay for everything. I went to Rhodes from Athens and then Athens to Santorini with the same carry on, and on the way back to Athens from Santorini staff said that if my carry on does not fit in their thing that "measures" our bags I'll have to pay 60\342\202\254. My carry on was less than 2 kilos. I made it fit and guess what - they didn't have any space in the plane so I had to put it with the checks bags anyways. Ridiculous. Also if you forget to check in 2 hours before they charge you 60\342\202\254 again to check you in. I've traveled with so many different airlines this one was far the worst one. Not recommended.
## 1134 Athens to Stansted. Excellent, efficient service on board. Food options to buy on board not bad at all, and not particularly expensive. The plane arrived 20 minutes early. Quick deplaning and leaving Stansted airport. Hand luggage was checked onto the plane without any issue. Plane new and clean, decent seat space, the only issue being that you cannot recline the seat. As they were half the price of the competition, will happily fly them again. Athens airport gate was a very long walk, but that is the fault of the airport, not the airline.
## 1135 Flew Ryanair from Dublin to Glasgow. Nothing to complain about. 1 adult and 2 teens to Glasgow just cost 50\342\202\254, so great value for money. 12\342\202\254 to prebook seats. Don't expect to sit with your family if you don't prebook in advance. You get what you pay for. 2\342\202\254 per person each way is great value. Staff were friendly both ways. Plane and seats were meh, what do you expect with Ryanair anyway.
## 1136 Edinburgh to Dublin. Nothing but grief and trouble from the start - extras for everything. We are pensioners not geeks and the Company refused to help stating' Do it online'. Very rude staff at Dublin airport and in several, poor English skills. We were so traumatised by the whole event we return with another airline. You can't say you get what you pay for because its not much to start with. Never use them they must hand pick the rudest staff in the country.
## 1137 Rome to Stansted. The flight was fair and reasonable. Firstly, I booked on the basis of cost and secondly on their flight schedule. The equivalent flight on BA at similar times was much more expensive. They charge for drinks and snacks but it was not a rip off. Flight attendants were polite and presentable. Seating felt a bit cramped but it was a 737. Flight out landed 15 minutes ahead of schedule but the return was delayed 45 minutes at the gate at Rome Ciampino. This is a small busy airport consisting of one terminal and one runway, which I would now try avoid at peak times. In summary, I would fly with Ryanair again and its worth checking out your flight schedule options from different UK airports to your chosen destination, with Stanstead being their main hub.
## 1138 First time with Ryanair, so having read all the reviews I was slightly worried. However the trip to Alicante from Manchester was a surprise. It was a newish plane with comfortable seating not reserved and reasonable legroom for a six footer +. Staf were friendly and not at all pushy as I had been led to believe. In all a pleasurable flight. Return however was different as it was an older type plane and although we had prepaid for seats on the return leg, they were extremely cramped and uncomfortable. They reminded me of the old "cattle class" seats when airlines didn't consider the customers just got as many on board as possible. I couldn't put the tray table down level as it was balanced on my chest! Staff were good again and friendly. If I book again I would need to know which type of aircraft it was before making a booking.
## 1139 Would never fly Ryanair again. Flew from Manchester to Rome. Despite checking in early we were allocated seats at opposite ends of the plane. When I phoned up they then 'sold' me the seat next to my husband! I understand that if you want to guarantee sitting together you need to pay for a seat but this is just a blatant money making venture. And the flight was late. Would not use again.
## 1140 I just wanted to warn potential passengers on this route (Corfu to Birmingham with Ryanair) not to bother with priority boarding as they simply send you outside to queue in the sun, along with those passengers that require assistance. They are making you wait for a bus to take you to the plane. Now my experience might not be typical but the wait was quite long during which time a second queue formed alongside the original. When the bus finally came the priority boarders were slowed down by those that required assistance and the second queue piled on. I would like to point-out that I did not pay for priority boarding however I managed to get behind them in the first queue. Despite this I was one of the last to board the plane.
## 1141 I am a frequent flyer yet this was the first time with Ryanair flying from Warsaw Modlin to Brussels CRL. This is a good airline, no hassle and straight to the point. Great mobile app. The only downside is the website, there are some lags with the search engine, login bugs and it wouldn't cost anything to make it more visually appealing. Generous luggage allowance compared to Wizz Air, no luggage checks or anything. Cabin clean, although certainly not elegant, generous legroom and I'm 191cm tall. I'd fly Ryanair again.
## 1142 Have flown with Ryanair a few times at this stage and from now onwards will try to avoid them at all costs as they are probably the worst airline after United. They come across as a low cost airline but they make up for it in as many ways as possible. If you want checked baggage it is an addition a fee of approx \342\202\25435 each way for a 15kg bag! If you don't have a boarding pass before arriving to the airport they will charge \342\202\25450 to print each one and their latest trick is to try and get people to pay for their desired seat allocation. If you don't want to pay for your seat allocation they will purposely split you up, myself and my partner were about 10 rows apart on our way to Palermo and back from Dublin. We know there were many others in the same situation including families with children. On my return flight I even had a free seat next to me. Seats don't recline on the planes and there are zero complimentary refreshments including basics like water. If you're flying from Ireland, just pay slightly more to fly Aer Lingus as at least with them, what you see is what you get.
## 1143 Manchester to Milan Bergamo. Seats apart if you don't pay Ryanair's fee, and forget luggage in the cabin unless you pay for priority boarding. And this is the second time they ruined a holiday for us - first time they simply stopped flying to our destination from the airport we had booked to fly from, costing me car parking charges and hassle of arranging an alternative holiday not in term time; second time they lost us the first day of our holiday by putting back the departure time by 6 hours - a useful ploy to get them around the three hour delay EU compensation rules. I vowed not to fly Ryanair again. Booked to Austria with Easyjet and they have also started the seat charges too.
## 1144 I implore others to avoid this airline at all costs. Do not be swayed by low prices as you would be better off walking to your destination. I have flown many airlines over the past 40 years and the worst experience I have had with an airline goes to Ryanair. If I would have been smart enough to read reviews before booking tickets from Stansted to Edinburgh, I am sure I wouldn't be typing a review while on holiday. Nickel and dimes are more like 20 - 100 $ to Ryanair and you will pay or you won't board your flight. No customer service, extremely rude employees who would obviously rather be somewhere else.
## 1145 Over thirty minutes late leaving Poitiers, but arrived at Stansted only a few minutes behind schedule. Pretty scruffy aircraft, obviously the late arrival in Poitiers left insufficient time for a thorough clean. Aisle seats are not great given the constant movement of trolleys and the inevitable knocks to arms and legs. Random Seat Allocation - This term is somewhat of a misnomer. The only way it is random is that if you don\342\200\231t pay to select a seat before travel you will certainly be allocated seats away from others on your booking. BA despite their recent demise usually have the sense to allocate passengers on the same booking adjacent seats. On this flight we were seated just 15 rows apart. From the comments of other passengers and on social media, this really must be considered an \342\200\230own goal\342\200\231 by the airline. Surely it would be better to increase lead in prices a little and get rid of this ridiculous policy and stop antagonising numerous passengers. Until the last couple of months I had been increasingly impressed by Ryanair\342\200\231s more customer focussed attempts. In future I will travel with another carrier wherever possible. Hopefully, the \342\200\230bean counters\342\200\231 at the airline will revert this ridiculous policy
## 1146 Flew from Edinburgh to Vigo. Ryanair were responsible for my wife and I being separated, they tried to hold our seats to ransom unless we paid \302\24320 extra (each way) for allocated seating which we refused on principle. As a consequence we were allocated random seats. The craziest thing is my wife found herself sitting in the middle seat between a husband and wife who were also allocated random seat numbers. Anyway, we got our revenge by frequently wandering up and down the plane to speak, thereby causing delays to the cabin trolley service. I suggest others should do likewise until this policy is binned.
## 1147 Absolutely awful experience flying with Ryanair from Mykonos to Athens. My friend and I made sure to buy 2 x 15kg luggage allowance each because we knew the charges would be exorbitant otherwise. Imagine our fury when the lady at the check-in counter insisted that "it wasn't reflected in the system", and tried to make us pay an additional \342\202\25462 to check our extra bag, even after we showed her our e-receipt, booking confirmation and boarding passes. She spoke to us as if we were stupid and just kept repeating "1 each," even though we had already explained multiple times! Seems ridiculous that the system could generate my documents with accurate information but couldn't do the same for hers? It reeks of a huge scam to get customers to pay more, even if they've already paid for extra baggage allowance. Boarding at the gate was entirely disorganised and messy, and the staff kept forcing passengers to prove that their carry on luggage was within the restricted size, only to tell them that their bags would have to be checked because the cabin was full. The staff in general were extremely rude and kept yelling at people to get out of the business class waiting area, even though there weren't any signs properly demarcating the place. To top it all off, the flight was half an hour late. Ryanair may have the best prices, but I give it 0 stars for quality, service and hospitality
## 1148 Flew Ryanair from London Stansted to Krakow. Ryanair started a random seat allocation scam, even if you book tickets together. They make sure people traveling together don't sit next to each other until they have paid an extra fee. Everyone around me had the same experience. Miserable staff. Only flew them out of the desperation because no other flight was available. Avoid if you can.
## 1149 I was found absolutely mortified when coming back from my holiday flying with Ryanair. The plane was hectic and had many difficult passengers onboard for the cabin crew members. Me and my sister paid for allocated seating going and coming back from Bristol to Malaga which cost us \302\24320 in total, which we didn't mind because we knew we'd be sat next to each other. Once we sat down we found it quite disrespectful to see passengers moving their loved ones next to the empty seats next to them and the crew allowing them to do so, and it wasn't just the one it was several. The flight finally departed and we was in the air ten minutes in a cabin crew member came up to us and asked if we would be separated for the flight for a lady that wasn't very well, when I explained that we had paid for these seats and many others hadn't but moved her response was roll of the eyes and stormed off. After that she was cold with us all flight and went straight past with the drinks trolley without even asking us!! It's made me not want to book with this airline again if that's how staff treat their passengers.
## 1150 Stansted to Athens. Being assigned separate seats at check in time and forced to pay for changing your seat is just ridiculous. This is a whole new level of low. I've been a loyal Ryanair customer for almost 10 years but enough is enough!
## 1151 I have just done my check in and to my surprise me and my boyfriend were allocated separate middle seats, 6 rows apart from each other. This has never happened before when doing check in. Now if we would like to sit next to each other we need to pay \302\2439 for reallocating one of us. I'm shocked how low Ryanair has fallen and with all honesty I can say this is the worst airline I have flown. I was a regular client of theirs but from this day I will definitely switch to easyJet or Wizz Air.
## 1152 Flew from Cologne-Bonn to Berlin. Absolute bargain at 12.98 euros one way. Since I went for the low price I didn't want to add any extras, so no reserved seat. It's irritating how Ryanair keeps pushing you to buy a seat 'or maybe you won't sit together'. On the outbound flight the computer put as together at an A and B-seat but on our way back we were punished for not buying our seats: my wife and I were seperated about 15 rows and put both in a B-seat. Why is a mystery since there were enough seats next to each other and the cabin crew allowed me to join my wife. I would suggest that Ryanair stops this mocking of passengers. Apart from that: a flawless, efficient flight with not too friendly crews, but it gets you form A to B for a really low price,,so in that regard they keep their promise. I even noticed more legroom thans to new seats.
## 1153 Stansted to Poitiers. Boarding at Stansted was somewhat shambolic. After queuing at the gate, we were then left standing on the tarmac for about twenty minutes before actually getting on the aircraft. Ryanair\342\200\231s recent charm offensive seems to have gone in reverse given the way seats are arbitrarily allocated at check in, unless you pay to choose your own. My wife and I were given middle seats in two different rows whilst both the seats adjacent to us were unoccupied. Bizarre!! This situation seemed to apply to many other families resulting in a shambles as many passengers attempted to swop seats in an attempt to sit together. Departure was thirty minutes late, but because of the generous flight times the plane landed in Poitiers just 15 minutes behind schedule. The only redeeming feature of this unedifying experience was the pleasant attitude of the cabin crew.
## 1154 I booked tickets from Stansted to Valencia for me and my partner at the same time. The latest money grabbing trick by Ryanair is to seat a couple at the furthest ends of the plane from each other, even when the plane has 90% empty seats, so that if you want to sit together you have to pay to allocate a seat - I have got to say I have been waiting years for them to work this one out - so predictable. This now goes beyond cheeky and is into the realm of despicable behaviour. Seats have always been filled on a first come, first served basis until now, so it is clear that this is done on purpose so as to generate more profit. But do you know what? This profit is not going to be coming from me, as I vow never to fly Ryanair again. I am a very regular flyer who tends to sway towards budget airlines, so EasyJet will be seeing much more business from me in future (unless they try the same filthy trick as Ryanair).
## 1155 Murcia to Luton. Am sitting on plane now and it is apparent everyone travelling together who are not willing to pay for a priority seat selection have all been split up, it's a disgraceful money making exercise to split up families who in the case of emergencies would all be trying to locate one another. I am disgusted that even Ryanair could stoop to this low.
## 1156 Eindhoven to Lisbon. We checked in 4 days ahead of our flight, which is the max possible, and they split me and my girlfriend while the plane was empty. Then they charge 10\342\202\254 extra to sit next to each other, while other seats where 4\342\202\254. I had to place my hand luggage under my seat while the luggage compartment was empty. Also totally rude stewardess.
## 1157 Stansted to Athens. I have been travelling regularly with Ryanair, purely because of the low cost, but this is the second time I met a helpful cabin crew member. There was no toilet soap / paper, as something had gone wrong with the providers at the airport and while the rest of the crew were "sorry" she went beyond expectations and tried to improvise to find solutions. This is the kind of cabin crew expected not only in big airlines but also on the budget ones. Congratulations to the attitude of that wonderful lady and may more follow her example. Customer service can make a difference in a journey and it did in this one.
## 1158 Ryanair have decided to issue free seats totally at random splitting up family groups. This seriously affects safety linked to any emergency or the comfort for nervous flyers. My wife and I have been allocated centre seats in rows of three, 16 rows apart and both entering different doors! This hampers boarding as we only have one phone with the Boarding bar code on. Not happy at all.
## 1159 Will not fly with this airline again. Used to fly with Ryanair no problem but after my most recent flights with them I will be choosing a more expensive option. I normally fly with my partner and our seats are always placed side by side without us paying extra. Lately it seems they are in such desperate need for money that's they are splitting up family members in order to get them to pay the seat selection fee. This is dangerous in case of emergency. Obviously family members will rush to find each other in case or emergency and this would create chaos. Me and my partner had two empty seats beside us in the plane anyway. Will be booking any other airline in the future.
## 1160 Bologna to Bucharest on March 16. The fastest drop-off baggage I ever met (up to 1 min.). 30 mins. late departure and 15 mins. late arrival. Otherwise, the flight was excellent, most of the passengers were young exuberant Italians prepared for a city-break in Bucharest, so the atmosphere was very nice. Fantastic cabin crew, young, professional, permanently working, smiling and chatting. Just 9 of 10 for a slight delay, maybe I'm too demanding. The price was a real bargain.I hope that Ryanair will increase its operations in Bucharest.
## 1161 The flight was ok as far as budget class can be. I hired a car via Ryanair's website. 1st problem was getting Goldstar car hire at Palma to accept my own damage waiver insurance. 2nd problem was unknown to me they slipped an extra charge called smart return fee on the invoice \302\24325. I assumed at the start of the hire that this was for the fuel and would be refunded when I returned the car fully fuelled. Apparently this is an extra charge to avoid "administration" fees should you return the car partly fuelled. You still have to pay for the used fuel. As far as I'm concerned it's a scam I thought I'd covered all the scams hire car company's use. I photograph the car damage before the hire started and the return. Kept the fuel receipts and photo'd the fuel indicator and milages indicator. This is a new scam for me.
## 1162 Stansted to Rome. Terrible experience. I know it is a budget airline and so have little expectation for amenities and service which is fine, but what I wasn't impressed at all is the lack of transparency in what's required. Myself & my partner were almost charged extra 50 euros each as we didn't know you had to print out the boarding pass ourselves. Luckily the lady at the desk found us a different solution and printed our boarding passes. This should be made clear not in small print. If there are extra charges for such thing, do make it clear as clickable option like Airasia do. I am quite put off to book Ryanair again.
## 1163 Edinburgh to Barcelona. One person tells us we don't need our boarding passes printed, so we went and waited in the gate line, when we got to the front another individual said they needed to be printed and therefore we had to wait till the end of the line. This now left no room for our carry on bags. Additionally, the gate number showed up and by the time we arrived at the gate (leaving immediately after seeing the gate) they were already doing final call (with many people having no idea what proper line they were supposed to be in). They are unprepared and overall messy.
## 1164 I recently flew with Ryanair from Stansted to Cork. This was the final leg of a 28hr journey from Canada back home. I forgot to check in online before my Ryanair flight but luckily had arrived 3 hours before the flight and 1 hour before online check in finished (which if I missed meant I'd be paying \342\202\25450). A Ryanair representative who went above and beyond to ensure I did not have to pay this. While I had enough time, my internet on my phone was shocking so to cut a long story short, he sorted me a phone to sign me in and then allowed me take a picture of the ticket. Then guided me to the front of the Q and another very helpful lady.This was incredible. Thank you so much!
## 1165 Boarded Carcassonne to Manchester bound plane 20 mins late due late inbound arrival from MAN (not Ryanair's fault). Informed cargo door had been damaged by a ground loader whilst parked at CCF on turnaround and that a RYR engineer had been sent from Stansted. Engineer arrived 19.25, declared aircraft ok to fly. We boarded again, then subject to a 20min ATC delay. Flight landed MAN 3 hrs 58 mins late. However, none of these issues were the fault of RYR, and each pax given a \342\202\2545 food voucher too. I say well done to the airline / tech / admin for getting us out of CCF the same day!
## 1166 Carcassonne to Manchester. Boarded plane 20 mins late due late inbound arrival from MAN. Informed cargo door had been damaged by a ground loader whilst parked at CCF on turnaround and that a RYR engineer had been sent from Stansted. Engineer arrived 19.25, declared aircraft ok to fly. We boarded again, then subject to a 20min ATC delay. Flight landed MAN 3 hrs 58 mins late. However, none of these issues were the fault of Ryanair, and each pax given a \342\202\2545 food voucher.
## 1167 Stansted to Rome return. I never leave reviews for such things as flights as I generally think most airlines don't provide a service worthy of leaving positive feedback, but this week I flew to Rome and returned from Venice using Ryanair. The flight out was excellent the flight crew provided really good service, were polite and very friendly. The return flight was delayed due to a medical emergency flying to Venice, where the flight had to make an emergency landing on the way out to pick us up. The flight finally arrived with less than 30 minutes to spare before the airport closed, they managed to turn the flight around in around 25 minutes which was remarkable, all the crew deserve a big thank you from all the passengers, and the company, again the flight crew were really friendly, and attentive even though they were obviously upset by the medical emergency. I want to say a really big thank you to the crew, you were excellent.
## 1168 Flew Ryanair from Bucharest to Timisoara. Cheap flights, but services are definitely not the best. Lots of flight delays announced at the last-minute, because of the fact that the flights are over booked the hand luggage had to be moved to the aircraft deposit, so at the end we have to waste extra time that we shouldn't have considering only a hand luggage. The trip delay caused damages to my business schedule, which is not the first time.
## 1169 Kerry to Frankfurt Hahn. This was a full flight but check-in and boarding were well managed and the flight departed on time. Service on board was efficient, professional and friendly. The range of food and beverages was good and prices are reasonable. The flight landed 10 minutes early and baggage was on the belt within 15 minutes from landing. I'm happy with the Ryanair service and would recommend the airline to others.
## 1170 Flew from Stansted to Fez. Ryanair did what it said on the tin and I got what I paid for. We were delayed 30 mins outbound and on time inbound. Cabin crew on outbound were ok but not going as far as giving a smile, on return the cabin crew seemed to be partying in the galley they were the noisiest bunch ever, slamming and banging and laughed raucously until it came to serving customers, then they went back to their stale faced selves. If you are over 5 ft 10 seating will be painful for flights over 3hrs. Will use again purely for price but wouldn't do a long flight.
## 1171 Ryanair is getting better and better. This flight from Frankfurt Hahn to Kerry was quite full but departed and landed on time. Service on the ground and in the air was very good. The selection of food and beverages was good and reasonably priced. The seat was reasonably comfortable and then aircraft was quite new. Overall, this was a good experience and I would recommend Ryanair to others.
## 1172 I've had bad experiences with Ryanair before, as it's just part of travelling economy with them most of the time. I purchased a flight that I immediately tried to check in on. However, I found I'd lost my passport. That's fine, I'd only booked the ticket 20 mins ago, so thought it would be reasonable to get a refund. They don't give one. So I want to change my flight, that's okay within 24 hours. There's a \302\2435 charge anyway, but that's okay. Except that Ryanair won't allow you to upgrade the next flight to match to price of your existing one, forcing you to undercut your ticket price and lose money. Ryanair don't refund this money back to you, won't allow you to use this money as credit on other flights or services and don't allow you to add options to your new flight, like additional baggage, ect. The customer service advisers I spoke to were awful, none of them made any suggestions or offered help, but continually spammed the same response about terms and conditions over and over. So I find that I can fly to Ireland without a Passport anyway, since I'm flying from the UK. I can use my driving license. Except you can't with Ryanair. You can with other airlines, but not Ryanair. So pretty much in every way, Ryanair have made this mistake as costly for me as possible. While I appreciate I made a mistake in that I should have made sure I had my passport to hand before I booked, the inflexibility, none existent customer services and just all around terrible service I received have made me decide to avoid this airline in the future.
## 1173 Flew Ryanair from Dublin to Copenhagen. Very warm welcome. Superb cabin crew who showed personality and humour. Great sales pitch when selling products, food etc. All in all a very pleasant and comfortable flight. Thanks to this particular team.
## 1174 Another well priced efficient trip on Ryanair. They have a well defined product and very little is at fault. Only thing on this trip both legs from Gatwick to Belfast return was that I or no one else could understand the cabin directors' comments on the loudspeaker. Something about a seatbelt and something about a lasagne for \302\2439. That was it. But good overall.
## 1175 Dublin to Manchester. Awful. Usually fly on alternative airline on this route but booked late and this was cheaper. You get what you pay for! Cabin dirty and unacceptable. Flight was 1 hour late and not a single employee, not ground staff, cabin or cockpit crew apologised for the delay which I'm sure comes from senior management. Manners cost nothing. Never again
## 1176 Ryanair provided exactly what I was expecting for the price paid flying from London to Cologne. Check in was fine as this is done via their app but boarding was late as always and the ground staff predictable indifferent. Once on board the seats were bearable with only a small amount of leg room. If I were over 6ft then it would be uncomfortable. Cabin crew are okay but spend the most part finding places for people's bags as they continually fail to impose size or weight restriction at the gate given the bags people bring on board. The flight was late arriving but nothing to severe and disembarking was a breeze with front ant back doors used. Overall you cannot have high expectations for the price and Ryanair are a decent choice for any flight sub 2 hours.
## 1177 Santorini to Athens. We had a flight at 7:30pm which was delayed for two hours due to what they called "bad weather". Olympic Air had a flight at the same time and they were able to fly. After waiting two hours they had everyone go through the security line again and then to find out the flight was cancelled. Due to this flight being cancel we couldn't make it to our flight from Athens back to the United States. The only thing Ryanair could due was provide hotel for the night. We couldn't make it to our flight and had to purchase new tickets back home which was expensive! Never flying Ryanair again.
## 1178 Flew from Glasgow Prestwick to Lanzarote. I have not flown with Ryanair for some years as my last experience was so poor. I was, therefore, pleased to find that both the flight and staff attitude had improved considerably. I also felt that the policy of trying to sell you food, drink and lottery tickets on every minute of the flight had been changed. You are limited on leg space but that is true of all budget airlines. The plane could have done with a more thorough clean between flights. I paid for speedy boarding and that made a big difference as I avoided the usual crush and was able to take hand luggage on board without worrying that it would need to be put in the hold. The plane was on time on both flights.
## 1179 Manchester to Dublin on a Friday night. Ticket with priority boarding and allocated seating came in at \302\24315 each way - bargain! Outward flight very rowdy with a Birthday group and two stag parties. Flight short 35 minutes, which was on time and efficient. If the price is right Ryanair are good value.
## 1180 Ponta Delgada to Lisbon departing at 0615. Check in fast and simple and didn't had to wait for long to board the plane. Getting a space to stow my bag was simple and there was plenty of room for almost everyone and the ones who had no space had their bags loaded into the hold. I wish the Boeing 737 was a bit more wider to have more space at shoulder height. Flight was very smooth, with no fuss. Flight crew was charming and the plane was clean. We arrived on time, maybe a bit sooner than predicted. Simple, easy, comfortable way to fly at a very low price!
## 1181 Lisbon to Ponta Delgada. Boarding was fast, the gate was announced a bit earlier it expected which meant we had to wait a bit before getting into the plane. Crew was nice, the bags that didn't have a place to be stored and sending them to be loaded into the hold. The flight left and arrived ahead of time. I was a bit unsure if they would accept my bag as I suspected it was a bit over the official sizes but nobody made any problems. As it was a very cheap flight, it was a wonderful experience, convenient and comfortable and the plane was clean.
## 1182 Liverpool to Alicante, on FR9886. After boarding the plane at approximately 6.45am, my wife and i both noticed that some of the passengers had brought onboard their own cans of beer and were starting to drink even before we took off. Throughout the flight the cabin staff were serving them alchohol even up to about half an hour before landing. They were very noisy, using bad language and generally causing a nuisance to other passengers. We certainly won't be using Ryanair again.
## 1183 Dublin to Amsterdam. Absolutely terrible experience. After being told to queue for boarding (while the plane was nowhere in sight), we had to stand for almost an hour before the plane arrived and we could board. After the door eventually closed (45 minutes after our scheduled takeoff) the pilot informed us we missed our takeoff slot and had to sit on the plane for near 2 hours before we could get another one. There were various other annoyances (not enough space for carry-ons, gate information not available until right before boarding was supposed to begin, etc). The overall experience was nightmarish and inconvenienced a plane full of eager vacationers. The lower ticket prices make sense now, and I strongly urge you to pay a little extra to avoid a similar experience.
## 1184 Athens to Sofia. While being an ultra-budget carrier, Ryanair has managed to make flying with them as pleasant an experience as possible for the cost. Just as much as I like flying expensive airlines, I like flying with them. Kudos to the entire team at the Ryanair team for making Europe more connected for more and more people each year.
## 1185 Flew Ryanair from Faro to London Stansted. Using 'Special Assistance' I found the cabin staff on both flights, as usual, very helpful. Outbound was a new 737-800 with the thinner seats and modified wing form which gave slightly more leg room and a quieter flight. An interesting phenomenon of the new wing form was that the vapour trail formed much nearer the trailing edge and was observable from row 28. Outbound was on time but return was delayed 30 minutes due to a combination of Stansted passenger delays and a strong head wind giving a rather lumpy ride on an older aircraft. One thing Ryanair have got right is their choice of red wine which for me is the best of all the low cost airlines.
## 1186 Porto to Barcelona. Another great flight with Ryanair. Departing from Porto is very pleasant as Ryanair uses a big hall in the groud floor from which people just walk to the aircraft and board using both front and rear door, this is somehow very convenient (unless the weather is poor). Our plane was new with their modified slimline seats, which, compared to the older type, improve legroom rapidly and with 185 cm, I felt comfortable. Also the cabin colors on their newer planes are not as agressive as it used to be a couple of years ago, a big improvement. Can't wait to be lucky enough to try the SkyInterior on a Ryanair flight. We arrived on time, the cabin crew was very nice and the flight was cheap, as always.
## 1187 I travelled Edinburgh to Barcelona on Feb 3rd 2017 returning on Feb 7th 2017. The outbound flight was early in the day however was ideal as you got an extra day in Barcelona. Return flight again was ideal, as you got home at a reasonable time. I booked extra leg room seats, 2D was my seat for both flights. With that you got priority boarding. Extra legroom was excellent, I'm 5'11 with back problems and I found this seat comfy and could straighten my leg out full with passengers who sit in 2D/E can get past me without hassling me. So I recommend anyone flying with RyanAir to do this! I would like a bit more cushion for your bottom. Priority boarding is good, as you don't wait in the normal queue, however its annoying when you are boarded first, and everyone is trying to get past you to get to their seat, and are hitting you with their bags etc. However great for you when you land, you are off first. One thing on the baggage, is on the Ryanair website they sound like they are strict with the baggage allowance. I noticed many people having 'bigger' bags getting on the plane okay, no questions asked. Thought that was a bit unfair considering I had cabin bag size. Mobile boarding, love it! However I would like Ryanair to do what easyJet do, and alert you of the gate via your phone. Anyway, I would fly again with Ryanair, always on time, never late, cheap, and very good!! I couldn't fault anyone, the cabin staff were great.
## 1188 Athens to Thessaloniki return. Pretty good and uneventful flights. Quick boarding, although lines were not always controlled and especially hand luggage (the passengers who came late to the gate were not checked at all with regards to that). Everything was on time. Cheerful and happy crew. Both flights were full. Very cheap (26EUR return).
## 1189 Dublin to Leeds return. Booked 9 days in advance for \342\202\25435! Flight over was about 10 minutes delayed. About 90% full. Surprised by how much BOB was sold on such a short trip, had a cup of tea for \342\202\2543. Landing was a bit rough. On the return, the plane was fully boarded about 20 minutes in advance of take off and we arrived 25 minutes early. Had a Gin and tonic for \342\202\2547.60, which is pretty standard when compared to bars. Staff were good on both flights. Will fly again.
## 1190 Ponta Delgada to Lisbon. There are many factors that contribute to a satisfactory journey and unfortunately not all the expectancies were met for this flight. Let's start with the positive side and then see what was wrong and could be improved. The value for money was great, just 15 euros for a 2-hour-flight. I would never had booked this journey without getting a similar fare. It makes all the difference. Now it's time to see what could be improved. Ground handling: below the standards. The incoming flight was delayed, so they decided to start boarding when the plane arrived at the stand. That added more delay and resulted in a slot loss and in a 30-minute-delayed departure, that could problably had been partially avoided with a better coordination. The flight time was shorter than scheduled, so that we catched up the delay and we arrived just 5 minutes behind schedule. The onboard experience was good and being asked to move to a vacant seat in the emergency exit row gave some rest to my long legs. Awesome, isn't it? Negative score to the bar service: the food products we selected were unavailable and that was a pity. I don't mind having a snack or to dine on board instead of doing it at the airport, but with no guarantees about the products available, I'll start to consider the airport bars when flying with Ryanair. At least, I can find more options and make my own selection.
## 1191 Lisbon to Ponta Delgada with Ryanair. Standard flight, with nothing impressive and nothing too bad, just a 2-hour 15 minute flight experience in a Ryanair middle seat, that sounded to me like being packed as a bombonni\303\250re. Great landing despite the strong wind gusts. Arrival 8 minutes behind schedule, acceptable for a late evening flight. Anonymous cabin crew. Great value for money, only 15 euros with a reservation made 3 weeks in advance. No frills airline, but made a new journey possible.
## 1192 Just flew from Birmingham to Malta on Ryanair FR3901, Best cabin crew, so friendly and seemingly loving the job they're doing! What a refreshing change. Flew back from the Caribbean last week on Virgin Atlantic Upper Class, today's crew could show them a thing or two!
## 1193 Bournemouth to Malta return. Both outbound and inbound flights excellent. Cabin crew friendly and very efficient and cannot fault Ryanair. The Boeing 737 is a comfortable aircraft and if you select the exit row seats you have quite a bit of extra legroom to make the journey more comfortable. Will be flying them again.
## 1194 Knock to Liverpool. Ryanair is a joke when it comes to looking after its customers. Due to fog at Knock airport on the 27th January, they left us waiting around for ages before informing us as to what was happening with the cancellation of the Liverpool flight. They then told us we were to go on a coach to Dublin to catch the 8.50pm flight from there - that would be fine but it was 6pm in the evening so there was no way of catching that flight.
## 1195 Athens to Berlin. Flight departed on time from Athens in an organized and orderly manner. About 90% full and very cramped. People taking loads of hand luggage, not really controlled, so hand luggage in the cabin is a big issue which makes boarding pretty chaotic at times. Arrived on time, disembarkation was quick. Very cheap flight - 16,66 EUR. For that price, the product is superb (as long as you follow the rules carefully and don't get trapped in their extra charges).
## 1196 Barcelona to Dublin. I have used Ryanair many times in the last year. I'm very impressed at their changed in approach to customers. They are efficient and professional at all times. A big change from a few years ago. Every staff member had a positive vibe and were only to willing to ensure all was well with our trip.
## 1197 Flew Ryanair from Faro to Edinburgh. Not as bad as the outbound experience but still left 40 minutes late in Faro as we missed our departure slot due to boarding the aircraft late. I later found out that it was the aircrafts first flight that day so don't really understand what could of caused the late boarding. If the first flight of the day for the aircraft was in the afternoon, cabin crew were distinctly average with odd deminers. Plane arrived in Edinburgh 20 minutes late, pilot and first officer were informative.
## 1198 Dublin to Budapest. I fly with Ryanair very often, due to studying abroad. I find the airline is good value for money. I do find travelling longer distances can feel a little cramped, which yesterday was definitely the case - it was a very full flight and I felt claustrophobic at the window seat with my bag at my feet, coat on my lap, and two female passengers to my right. Usually I get over the claustrophobic feeling, but this time the heating on the plane was very over-powering and it got so warm I started to feel sick, dizzy and faint. The cabin staff and the head air hostess on duty were professional and had a rapid response to me which I am so grateful for. If it wasn't for them, I would have passed out or thrown up, or both. They removed people immediately from my row so I could lie down and elevate my legs. I was offered tea and sugar and a member of the cabin staff sat with me until the colour came back into my face and I felt normal again. A big thanks to all the cabin staff (FR1023 on 7th January) for being so efficient and kind. I really appreciated it. Happy New Year to you all.
## 1199 Due to fly Ryanair from Tenerife to Stansted. Went through customs and flight was delayed by over 2 hours. Queued up for 45mins to speak to staff member at the gate as there was no information desk. Spoke to the staff member and got sent back out of customs to talk to one of their colleagues at the customer service desk and was told that the flight will be here before 9 but flight information screen says differently. The t&c says compensation is provided for food and beverages if the flight is delayed by more than 2 hours but the staff told me it was 3 hours and would not provide a voucher for food and beverages. Whats the point in having T&C if you make them up.
## 1200 Edinburgh to Faro. Checked in online, so upon arrival at the airport proceeded straight to the gate to find that just under half the flight had also purchased priority boarding so that pretty much defeats the point of the perk! We were then made to queue outside for 20 minutes until the aircraft was ready - bearing in mind it's January and we're in Scotland, it was freezing. Once I boarded the aircraft one of the flight attendants commented on how cold my hands were which was bizarre as the only reason I was that cold was due to the airline that they were representing. The flight also almost ran out of food and they flight attendants couldn't of cared less, it felt like they just wanted to finish their shift and get home. We missed our departure slot at Edinburgh which was slightly frustrating as we were standing in the cold outside the aircraft for so long - but the informative Captain got us there only 5 minutes later than scheduled! It made me laugh however when they thanked us for choosing Ryanair because in actual fact, we did not have a choice for our dates of travel. Overall I just did not feel as well looked after as I continually do on their rivals easyJet.
## 1201 East Midlands to Faro, Faro to Bristol. I require special assistance and on recent flights the Ryanair staff went beyond their statutory duties to help. Faro to Bristol the cabin staff not only ensured we were comfortable but placed our cabin bag in the locker and removed it on landing, and also insisted on carrying it out to the lift for us and wishing us Seasons Greetings. On our return from East Midlands we were late following car problems, went to the un-manned special assistance desk and after a delay were told we only had 20 minutes before the gate closed and to go direct to security. We were then turned back and told we had to check in our case at the Ryanair check-in about 200 yds away. We got there with 3 minutes before the gate closed and the lovely lady there checked our case, told us not worry and went off to give the EMA staff an ear-bashing. She got a wheelchair and pushed us to security herself where the EMA lady took over and we made the flight safely. On this trip I would like to highly commend both Ryanair's cabin and ground staff for their efforts to give us a smooth trouble-free flights.
## 1202 On the whole the flight from Manchester to Berlin was good, nothing to complain about there. I have a nut allergy and according to sources on the internet the best thing to do (given Ryanairs limited advice on it) is to inform the cabin crew upon arrival. Then they should make an anouncement about the nut allergy and also stop selling nuts inflight. However this was not the case, after telling the cabin crew about my allergy, they proceeded to do absolutely nothing. About halfway through the flight I was even asked if I would like to purchase some peanuts.
## 1203 Dublin to Gatwick. Delayed flight due to fog at Gatwick - pilot kept us fully informed as it turned out only about ten minutes late. People boarded in a relaxed manner and staff friendly. Efficient loading and unloading - buses orderly at Gatwick and Ryanair passengers don't dawdle about. Not sure why there are negative comments when flights can be purchased for \302\24315. All airline seats are virtually the same now and many airlines sell you anything that isn't nailed down.
## 1204 I'm pretty amazed by the positive comments for Ryanair. I was flying with them last week from Malaga to Palma de Mallorca, after many years avoiding them. I'm not criticizing this company, but it is obvious that is a low cost company without any kind of comfort for the customer. I have experienced long lines in order to access the plane and have a place to store your luggage - it doesn't matter if you have assigned seat. Passengers have to stand more than 45 minutes before the call to board, and even after this they made us to wait other 30 minutes before entry to the plane. Once inside there is a big rush of people trying to put their luggage in rack without any consideration for the next passenger. Staff quite overtaken by this and during the flight only bother to sell food, drinks, lottery tickets and perfume. Our flight had 1 hour delay. Seats are quite uncomfortable. All in all, they transfer you from A to B in the most basic fashion.
## 1205 London Stansted to Berlin Schonefeld. As a first-time flyer with Ryanair I cannot find fault with them. I found the online booking simple and very straight forward. The plane was clean and comfortable. The staff were very helpful. As on the return leg because there were some empty seats and I do need more legroom I was offered a different seat with legroom (as well as my wife) so we could sit together as well. I would definitely fly with Ryanair again.
## 1206 Absolute worst airline. I made the mistake of booking 3 trips with this airline. 2 of my trips were canceled by the airline, leaving me stranded in Paris and Greece with no help at all and leaving me with a bill of $450 that they would not reimburse. The one trip from Dublin to Copenhagen that I did make it to my destination on, we were delayed by over 1 1/2 hours. Cabin crew were rude. I have nothing good to say about Ryanair and will never fly with them again, no matter how cheap their prices are. I have flown other budget airlines with no issues and enjoy most all of my experiences with them, but Ryanair takes cheap to an unbelievable level, and I guess you get what you pay for.
## 1207 Great customer service and free! I made an exceptionally silly mistake, booking London to Copenhagen, when I should have booked Copenhagen to London. I tried to Manage My Booking but it was impossible to switch departure and arrival terminals. I logged into their Live Chat and within minutes (shorter than the countdown expected on screen) a support agent assisted me and changed my flight details including baggage without a fuss or additional payment. I was surprised that they dealt with my mistake so efficiently and made me confident to book with Ryanair again. Exceptional service.
## 1208 Flew to London Luton from Copenhagen with my sister in November. We both had certain expectations on how the flights would turn out and we were to say the least: Anxious. However, we both got surprised on how smooth and painless everything went. Since I work as a travel agent I knew of all the "hidden" fees and everything you need to do prior to your arrival at the airport, so check-in etc went very smooth. We chose to purchase the priority boarding queue which turned out to be totally worth it, we had lots of room while we were in line since most people used the regular line, which was very comfortable. We boarded a little late, which we we prepared for so no harm there and once we got on the aircraft the cabin crew were very friendly and even funny. The security briefing went by very fast though. Take-off and landing we're both rather quick and steep, which is not what we're used to but still, nothing to really complain about. I can only say Ryanair really delivered, I've had worse flights with SAS.
## 1209 Budapest to Manchester. Ryanair is awful. I'm currently stood waiting for boarding in what can only be described as a glorified shed in Budapest Airport. It's -5c and there are no seats, on my flight there are pregnant women and families with young children. I can just about accept that Ryanair has a purpose as a no frill carrier but this is very poor. I've been in the aforementioned shed for 20mins now, who knows when I'll be able to have an uncomfortable seat in bright yellow surroundings
## 1210 Ryanair's hub in Paris is a little far out of Paris which is disappointing as it's not at all accessible as Orly or CDG but nethertheless I had a great on time flight with Ryanair from Paris Beauvais to Venice Treviso for a great price. Everything ran smoothly, the ground and onboard crew were informative and pleasant.
## 1211 I have flown with Ryanair very often over the last few months from Edinburgh and Glasgow down to London. The aircraft are clean. The flights are on time and the prices are ridiculously cheap. You can get Edinburgh to London single from \302\2439.99 if you book early. I find the staff on board tend to be very pleasant and helpful. The seat is fine, it is certainly not the most comfortable ever but given that they only do short flights this is fine. The only slight annoyance is that there is no seatback pocket to put anything in. Overall I would recommend them highly, I think that the value is much better than BA. Ryanair do not charge for a credit card payment, BA charge \302\2435. Ryanair are more frequently on time in my experience, and the prices are often around 1/8 of BA prices. No contest I would choose Ryanair. Stansted as an airport is fine, the security was better before they meddled with it, the staff can be rude, but this is the same for anywhere, the main problem is that other passengers at Stansted are just awful, but once you've been a few times you find the quiet seating areas away from everyone else. Ryanair is a good experience, especially for the price. To sum up it does what it says on the tin. To those reviewers complaining about being charges to check in, this is commonplace now, read the instructions before you book and you'll be fine, its not Ryanair's fault.
## 1212 Manchester to Alicante return. The outward flight was punctual and I had an empty seat beside me - always useful as you can twist sideways and gain a little extra comfort. The inflight service was poor. As seats on Ryanair do not have pockets, the price list in contained in their magazine. On this occasion, none was offered. Instead, cabin crew simply started selling. I asked for the list and was astonished to find the prices expressed in euros. When I questioned this, the steward told me that this was because Ryanair was an Irish airline. When I asked what the conversion rate to sterling was, I was told it was roughly the same. Crews are now equipped with handheld calculators. I was 'allowed' to pay in sterling, but, when I asked what the exchange rate was, was simply told 'Ryanair's own'. So, to sum up: lack of transparent/any visible pricing, exorbitant on-board prices - and not even a half-melted ice cube in sight! Why can't the CAA set some basic standards and sort Ryanair out once and for all? We know the fares are cheap, but that shouldn't be an excuse for trying to bamboozle people. And certainly a price cap is needed for printing boarding passes at the airport. The flight back was in complete contrast: well-dressed cabin crew, girls made up immaculately, good piloting and on-time landing. Needless to say, this time I didn't try to buy anything on board. Flight only marred by screaming babies for the first half hour and again on the descent. Yes, you can encounter a poorer type of parent on Ryanair, as well as on many others!
## 1213 Stansted to Pozna\305\204 with Ryanair. I usually pick Ryanair cause I truly hate flying from Luton Airport. I flew many times with Ryanair, and what I can tell is that they have very good ground service. Quick check-in, possibility of having e-boarding pass (much more useful when you don't have a printer) - 10/10. What always happens fir me with Ryanair in Stansted is delays. On my most recent flight with Ryanair everything was perfectly on time. Boarding was quick, no problems. I was sitting at the front of aircraft - seat 07C - first from the aisle. I would never ever do that again. I would rather pay extra money to sit next to the window than 50 cm away from nonstop walking cabin staff. I know they are cheap airline but 1,5 hrs of nonstop walking and talking passengers (selling charity coupons, duty free stuff, food & drinks) are tiring, when you just want to rest a little. Ryanair is worth travelling with, best choice to travel around Europe for small amount of money.
## 1214 Barcelona to Rome with Ryanair. Very good option to travel on budget in Europe. The boarding as well as the baggage-drop / check-in processes were efficient. Do make sure to get a "visa check" stamp if you are not an EU citizen, and this can be done at the baggage drop / check-in counter. The seats were okay for the 2 hr journey but would be rather uncomfortable for a considerably longer flight. The flight took-off almost on-time and arrived early. This was appreciated. I would fly Ryanair anytime again at these prices.
## 1215 London Stansted to Shannon with Ryanair (return). I have flown on various airlines around the world. The cabin crew are always the most important aspect of my flight. The crew on this particular flight were super and very professional and just friendly enough. I would highly recommend them. They are, in my opinion, the first-line recommendation for the airline and the crew on this flight was some of the best I have encountered. The senior steward was from Italy and the second steward from Portugal. They were impeccably dressed with impeccable manners.
## 1216 Berlin to Vilnius. After years of reading bad reviews and articles about Ryanair I was very hesitant to fly with them. However, I decided to try them when I found a very low price to my destination, and also because a friend told me they'd improved their customer services considerably. The on-line booking and purchase were simple and straight forward. I received several follow-up e-mails reminding of any additional services I might like to add. Check-in at Berlin Schoenefeld was fast and there was no line. Boarding on-time. Although my carry-on day pack was probably a bit larger and heavier than the rules permit, no one looked at my hand luggage or hassled me about it. I had paid for priority boarding, which worked well. There was separate priority line and we were allowed to board first. The plane was clean, the seat reasonably comfortable, and the service was friendly and efficient. I noticed none of the excessive announcements or heavy selling that I'd read about. Take off and landings were on time. The return flight from Vilnius was equally good and without problem. I was pleasantly surprised by Ryanair and would certainly fly them again. They seem to have turned over a new leaf.
## 1217 Lisbon to Ponta Delgada with Ryanair. I have to give a thumbs up for the ground crew, the flight was delayed for about 1h and they came and told everybody and apologised for it personally and not simply with an announcement, a lot of traditional flag carriers should learn from this. Boarding was fast and we departed late but not as late as we were expecting. The airplane was clean. The crew was very friendly, smiling all the time. Not sure if this happens every time but whenever I travel in the last flight of the day with Ryanair, the crew seems to be much more friendly and playful, with a light mood and doing some nice jokes to cheer the passengers. On board sales service was well provided and prices were affordable. Once again, the crew was very effective and helpful with passengers buying items as I did. Flight was very quiet, with zero turbulence (which is rare in a flight to the Azores) and although we arrived with a delay, we manage to recover some of that 1h delay, arriving with something like 30 to 40 minutes late. Unboarding was very fast and crew was friendly saying goodbye to the passengers.
## 1218 Rome to Lisbon with Ryanair. Ground crew was not as helpful and nice as it is usual but they did the job. Boarding was a bit long but nothing serious. The plane left on time. Crew was very friendly and helpful, always with a smile on there faces and eager to help anyone who needed. The plane was kept very clean and they provided the inflight catalogue for anyone who needed it. I have to say I was impressed with the way that the crew interacted with the senior passengers and kids. The flight was very calm and relaxing and we even arrived before time, which meant we had to wait for a parking space. Nothing serious. Great value for money!
## 1219 Flew from Belfast to Lanzarote for \302\24360 return. Both flights left on time on a spotless modern aircraft. On board service excellent. Would now use Ryanair to fly to any destination. I have flown with them on numerous occasions and never had a problem. Obey the rules and you will be fine. Fantastic value.
## 1220 Lisbon to Rome with Ryanair. Boarding was simple and fast and although it was an evening flight, we left on time. Cabin crew was helpful and friendly. Boarding was completed in a very short time and the plane left with no delay. The airplane was kept very clean, and it was a pleasant flight. Almost 3h in a low cost airline is something I would expect to be a bit dreary but it was nice. Seats were comfortable and with enough legroom but it was spartan (no pouches to store belongings) and shoulder room was a bit cramped but that is a characteristic of the Boeing 737-800. Quiet flight, simple and efficient service and very fast disembarking. We arrived a bit late but the difference was negligible. It was a good experience and an amazing value for money.
## 1221 Ponta Delgada to Lisbon with Ryanair. Boarding was quick enough and the staff were efficient and helpful, helping everybody to get to their assigned seats and getting all carryons to the overhead bins. The flight left on time, flight was pleasant and with no turbulence and we even arrived a bit ahead of schedule. The crew was nice and helpful and service was light and joyful. Being a low cost airline, no food or drinks were included, no inflight entertainment was provided and seating was simple. The airplane was kept impressively clean. All in all it was a very pleasant experience, specially considering how little the flight had cost me.
## 1222 Stansted to Rome. Flew with Ryanair back in October. Both flights were on time. We had priority boarding so we were one of the first people on the plane. We had to get a coach to the plane at Rome. On other flights once you get on the coach it's a free for all to get on the plane but this time they had split the coach into two for priorty boarding and other, so priorty boarding was let off the coach first. Will use Ryanair again.
## 1223 Manchester to Malaga. Well people said not Ryanair when I told them who I was flying with and all I can say is they were very good. Staff smart and friendly, plane clean, food available and not that bad. Flights on time within a 15 minute slot. Definitely fly with them again.
## 1224 Budapest to Berlin. We chose this flight because it was cheap and convenient. However, this flight just ruined the impression of our vacations. We arrived 2 hours 40 min before our flight and at the check-in desk we were told that we need to pay additionaly 120 euro (60 euro per person), because we didn't check-in online. Before printing out our booking we didn't read the info about checking-in online. There were many people with the same problem but least we had some money left to pay. This online check-in is common knowledge, but not for us, as we traveled with Ryanair for the first time.
## 1225 Flew from Rome Ciampino to Lisbon. Time is one of the most important factors when I travel and I have targets to achieve and I am pleased to say that Ryanair played a relevant role to allow me to be efficient. Arriving around 25 minutes ahead the schedule gave me the chance to do what I was supposed to do earlier and it definetely simplified my day program and also gave me some (extra) free time. If I have to choose between paying more for additional service or to receive a smart, no frills service, I have no doubts: Ryanair will be my choice. When I booked this flight (4 days before departure) a direct flight (with more or less the same schedule) from another airline was about three times the price. The fare was not a "low-cost" fare but it was the cheapest and most competitive one. Arrival ahead schedule, very positive overall impression.
## 1226 Porto to Milan Malpensa. Departure on-time, arrival 10 minutes behind schedule. I didn't like the fact that passengers were pre-boarded and asked to wait about 10 minutes outside the terminal building, as it was a little bit cold in the morning. The plane was new, with redesigned interiors, softer colours and LED lighting. As I am about 1.90 m tall, legroom is very important for me and I felt satisfied with my seat, as I had enough space to stretch my legs. The cabin crew were nice, welcoming and funny, so the flight was pleasant except for the commercial announcements that were very frequent during the journey. The flight was very cheap (around 20 Euros), so onboard sells are a source of profits for the airline. A good no-frills flight with an incredible value for money.
## 1227 Lisbon to Porto with Ryanair. Boarded completed 10 minutes before STD, departure on time. Arrival 10/15 minutes ahead of schedule. As always Ryanair offers a cheap, fast and efficient service. If you are smart and you need a no frills service, Ryanair is the perfect airline to fly with. The T2 in Lisbon is small but you can find a few fast-food restaurants to have a snack or light meal before your flight. With no queue at all the security check, being at the airport 45 minutes before departure time is more than enough. This flight cost less than 10 euros.
## 1228 Stansted to Rome. Ryanair was what I expected: bare-bones, a la carte, transportation from Point-A to Point-B. To that end, it was fine. I bought priority boarding, priority security (Fast Track) and priority seat assignments. That made the experience tolerable. However, Stansted Airport was a disaster, and I would never again fly out of there. Add to the unbelievably large Duty Free Area the fact that a gate is not assigned until about 40 minutes prior to departure. That is unforgivable - that leaves scant little time to get to that gate. In our case, the single escalator leading up to the Gate 40-59 waiting area was out of service, so 180 passengers per flight times 19 gates meant over 3400 people were trying to ascend a single staircase. The obvious fire-hazard aside, it meant a crush of humanity in the passageway and an exceptionally long transit time from the hub to the gate. The only reason I can see for this is to keep the passengers in the shopping/dining area as long as possible. Rome Ciampino, on the other hand, is a dump, but quickly navigated. If I could fly them without transiting Stansted, I would consider it.
## 1229 Sunday 19.35 flight from Dublin to London Gatwick, left promptly despite a small delay and ground crew apologised. This was in a refurbished plane which is excellent - better seating ( no reclining seats still - even better) and pull down case storage highlights those all bringing on more than they should. Staff very pleasant and a quick taxi and take off followed. Arrived early at gatwick -job done. I am still perplexed by those who cannot understand the concept of a low budget airline- you print your own ticket off, accept the terms and conditions when you book the flight - why are we still reading comments from people who cannot grasp this?
## 1230 Stansted to Treviso with Ryanair. Departed on time and landed a few minutes early. It was an all-Italian crew who went about their work cheerfully. Trevino to Stansted return trip was very much the same, left on the scheduled dot and got in 20 minutes early. Once again the crew were chatty and professional. Ryanair seem to have really upped their game.
## 1231 I flew with Ryanair from Marrakesh to Seville on 24 September 2016. I bought the priority boarding and 15 kg baggage. The ground staff were very helpful and nice. The flight was not that full and there were some space in the cabin for baggage. The flight attendants were nice and worked professionally. Overall the flight was good.
## 1232 Berlin to Vilnius with Ryanair. Boarding was fast and smooth. No complaints about that. Inflight service was sort of poor because you feel like you are in a huge market. Cabin was fine, floor was vacuumed and seats were also clean. But the main reason why I decided to rated them highly was the cabin crew. I've never seen such welcoming and warm flight attendants even though I fly a lot. We managed to talk with them during the flight and as a result we got a selfie. Thank you for making our day a bit brighter.
## 1233 Copenhagen to Edinburgh with Ryanair. Absolutely appalled. Have been sat in Edinburgh airport for 40 minutes waiting for my hand luggage that was stowed under the plane despite the face there was ample room on the flight. I have missed 2 trains. All because my standard sized hand luggage not allowed on the aircraft incredibly frustrated.
## 1234 Thank you to Ryanair cabin crew. Flying back from Alicante to East Midlands they couldn't be faulted any way. Helped with all our baggage on and off the plane. We were in a party of 7. My husband has walking difficulties also having two under 4s with us, we assumed there would be big problems but no, so friendly and considerate to what was going on. Food was great both hot and cold. Would recommend Ryanair to everyone. Not my first journey with Ryanair and won't be our last.
## 1235 Bremen to Stockholm Skavsta. Paying the extra 200% for a business ticket made Ryanair fine for a quick business trip to Sweden. My boarding pass issues were fixed with a smile and no bag issues, boarding was a breeze. Bremen terminal is a big cheery shed. The yellow and blue seats probably out of the local school hall. Perfectly convenient. Worth paying the premium for peace of mind.
## 1236 London Stansted to Tallinn with Ryanair. Absolutely one of the worst airlines on the planet. Don't be fooled by the initial cheap fares. They add charges for everything: printing your ticket, baggage check-in, meals, drinks, choosing your seat etc. Traveling around I did not have access to a printer. At the airport they charged me 15 Euro just to print the boarding pass, which I had to do myself. So that is charging me 15 Euro for me to touch their screen a few times and use a small piece of their paper? This, and everything else, is pure extortion. Even on the flight you are constantly harassed to buy things. There is no doubt that you are seen as a money-making opportunity and not as a person or valued client. The crew are friendly, but not the ground staff and their system is cumbersome and disorganised. I vow never to fly Ryanair again. I'd rather pay a higher fare with another airline and get good service which in the end is not much more expensive anyway when one considers all the additional charges.
## 1237 Flew Ryanair Bristol to Mallorca. from Wouldn't recommend this airline, you get what you pay for, online check in completely confused, having to check in and print boarding pass while on holiday unbelievable then have your entire party sit in seperate seats including children of 2 and 12 disgraceful. Flight reasonably comfortable for short haul.
## 1238 My wife and I flew Ryanair from Stansted to Faro return on a Boeing 737-800. We were 30 minutes late leaving the gate at Stansted because 2 families who had not booked seats in advance were not happy with being separated. Quite rightly people who had booked would not move so they had to take the seats given. If you book in advance it saves problems on the day. On return we were again 30 minutes late due to late arrival of aircraft. This time we had a child on board who screamed for most of the journey, not Ryanair's fault. We made no purchases. The non reclining seats give enough leg room.
## 1239 Bergerac to Stansted. Just come off a particularly unpleasant Ryanair flight where for the entire 1 hour and 20 minutes my wife and I were subjected to an all pervading smell of vomit. When initially challenged the cabin crew claimed to know nothing about this although we were offered a move to the row of sets in front of us (which was empty despite an otherwise full flight) and from whence the smell seemed to be emanating. Interestingly when we raised the issue of the foul smell with a different member of crew, on leaving the plane we were told that we had been offered a move and that there was a limited amount they could do to clean up vomit so despite the initial denial of knowledge the crew were well aware of the unpleasant conditions in which we had been expected to travel. I am well aware that Ryanair is a budget airline and am generally happy to accept that but do think they need to adhere to basic levels of cleanliness and be honest with passengers which sadly wasn't the case today.
## 1240 Stansted to Faro return. On both flights we had great crew members and cannot fault them. On the way out the crew asked for medical assistance for a passenger and I went to help. The crew were very professional and gave assistance including oxygen for the passenger, and the situation was dealt without having to divert the aircraft. I would recommend Ryanair.
## 1241 Dublin to Bristol. On time and good value - what more can one ask for on an hours flight ? There is rather a lot of queuing to get on and off and the seats are not very comfortable. The cabin crew are hard pressed to get through all the duties due to time constraints. Long walks at Dublin, but short ones at Bristol.
## 1242 Brussels Charleroi to Fuerteventura. Outbound flight delayed for about 1h40 due to technical with incoming flight from Rome which was orginally the plane foreseen to be taken in stead of the one coming from Bergamo. Seats on the first row at the door offer a lot of legroom but are very small in width at the least the middle seat was. Very nice cabin crew with special thanks to Eva who was the chef de cabine, this lady is really exceptional! Return flight on time with an ok crew who did their job. Seats on return flight were row 2 on the otherside facing the wall, offering good legroom as well and seats seem to be a bit wider at the least the middle seat was. Due to the seats chosen, we had priority boarding on both flights, which was really a bonus to avoid the long queues! Except the delay on the outbound, no problem whatsoever with this airline and their smartphone app and website are really easy to use!
## 1243 Thank goodness the flight from Manchester to Madrid was short. Seats bolt upright and uncomfortable. Food and drink, optional and expensive. Suppose you get what you pay for when options are limited. Priority boarding a joke. Down the stairs to wait in the cold for 20 mns. Then aboard a bus. Where's the priority gone then. 15 kg bagage allowance is a joke. Use only to keep costs low if no option.
## 1244 Ibiza to Bologna. Cheap for a reason, If anything goes wrong they will charge huge fees and then if you try and complaint to get a refund they are unreachable. We had a printed boarding pass and it was fine right up until entry to the plane where apparently a new booking was made and we had to pay a 45 euro check in fee and then to get refund later. Good in theory but try even contact anyone in Ryanair, its impossible. Do not use this airline.
## 1245 Milano Bergamo to Oporto. Very essential low cost airlines. The seats are uncomfortable and you can not recline. The crew were friendly but the boarding procedures were chaotic. Suggested only if the ticket costs is very cheap - during the flight you can buy food and beverage but is quite expensive.
## 1246 First time on Ryanair for at least ten years and it took the availability of direct flights to the north of Spain to attract us back. We took the business plus option and, while more expensive, it was certainly cheaper than any other option on any route to the same area. We were certainly happy with the service through Edinburgh airport, although there didn't appear to be a dedicated business plus desk available, but the fast track through security and the early boarding were very welcome. Flight departure was scheduled for 6.55am and by 6.25 we were standing outside the airport buildings at the head of a long queue waiting for boarding. This is probably the worst part of flying with Ryanair and such as passengers may be exposed to the elements for quite some time waiting to board, thankfully on this particular morning it was dry, not too cold and bearable. The crew appeared about 6.30 and by 6.40 we were in our seats watching the oncoming passengers in what appeared to be a full load struggling to find overhead locker space and, some their seats. Departure was delayed by half an hour for air traffic control purposes but, once airborne everything went very smoothly and I managed to catch up with some sleep on the way. Cabin crew were friendly, informative and appeared to meet all the needs expected of them by passengers. The return trip was somewhat similar although check-in in Santander was through normal processes, i.e. we all queued up for two desks and took our turn with everybody else to check-in our bags, there was no special service for business plus but that was not a problem as the staff at the desks were quite efficient. Again, the wait outside for boarding, this time in nice sunshine, aboard in plenty of time and airborne exactly on schedule. A newer aircraft this time with the more modern Boeing cabin lighting etc. Good service from the crew and this time we availed ourselves of the excellent coffee and a croissant at an acceptable price. Flight was very smooth and arrival in Edinburgh some fifteen minutes early. Quite impressed with the "modern" Ryanair approach and we would be very happy to use them again.
## 1247 Flew Dublin to Amsterdam with Ryanair. After being left standing on the tarmac in the cold for well over half an hour, with no information forthcoming as to why we were not being boarded onto the aircraft standing right in front of us, we were herded back into the terminal boarding area, now full with passengers for the following flight and told that we would all have to be checked in again. No apology, no explanation, nothing. Some 30 minutes later we were boarded onto a different plane which stood on the tarmac for at least another 45 minutes waiting for refueling. Apparently, the first aircraft had too much fuel on board and the second not enough. Adding insult to injury our vegetarian panini was full of bacon and the replacement we were given after complaint was best before September 2016. Again no apology from the surly hostess who threw 5 euro at us when we showed her the date of expiration had passed. We made our connection to Abu Dhabi with five minutes to spare, sweating profusely from the sprint through Amsterdam airport.
## 1248 Just returned from Lanzarote flying on the 4th Oct 2016. Did not bother to have a drink in the airport as thought we would wait until we were on the plane. They announced that as this was the last flight they were running short but did not say on what. When they did come round they said they had no milk or sugar, why could they not have got any when they landed at Lanzarote? It would not have taken much to have got someone to take some to the plane as suitcases and passengers were bording. It made the four hour flight bad and we had to have a cold drink, they charged us \302\2434.80 for two small cans. Will try to fly easyJet next time or take our own drinks.
## 1249 Ryanair is really low cast even if you fly "business plus" like I did. I flew from Berlin Schoenefeld to Bratislava and was surprised with the service. The crew were a bit stressed but however very friendly and safety-conscious. Every crew-member spoke clear english and one of them even a bit of German and Dutch, the other ones Italian and Slovakian. Boarding was fast and on time, finally I arrived 15 minutes earlier than scheduled. The only minus is the cabin wich was old and worn but still comfortable.
## 1250 My wife and I have just returned from Tenerife after 1 weeks holiday. On the outward flight my wife asked for a cup of tea only to be told that they only had coffee left. There were no inflight snack magazines in place for people to look at, all we had were adverts stuck to the back of all seats which said that there were hot beverages available. On the homeward flight you could have any hot drink you wanted as long as it was coffee with out milk or sugar, my wife asked for a bottle water so she could take her tablets and she was charged 3.50 euros for a bottle that only costs 1 euro to buy in the airport. It is awful that when the plane lands at its destination that they do not request a restock of items that they are low on.
## 1251 Quick weekend trip to Berlin with Ryanair, we paid only 40\342\202\254 for return tickets for both of us, which is incredibly cheap. We have flown with Ryanair before, so we knew exactly what to expect. You literally get what you pay for - transport from A to B and that is it. The flights were on time, boarding process was fast and efficient, the airplanes were clean. You have to get ready for small legroom and no recline, but most of the flights within Europe are short, so it was ok. I really can't say anything bad about Ryanair and their policies, because it is them who made flying so affordable and we should be thankful. Looking forward to another budget trip with Ryanair, which is coming soon.
## 1252 Flew Ryanair from Madrid to Porto. Really great service both on the ground and in the air - the staff were friendly and smiling, and very helpful. Check in was smooth (although the boarding pass was handwritten), and we dropped off our bags without a hitch. Our seats didn't recline and there was no inflight entertainment but that is to be expected and for a 45 minute flight it was fine. Great price point for Leisure Plus class which includes one checked luggage, would fly again.
## 1253 Bologna to Brussels Charleroi. I have travelled a lot with Ryanair and this time the flight was nice and on time. The crew was as always were friendly. The seats are comfortable enough when only flying for a maximum 3 hours. They serve some food and beverages on board, which you have to pay for but I think that is quite normal when the ticket is that cheap. The food is alright and I really liked the coffee onboard. And before you know it you're landing 10 minutes earlier than expected at your destination.
## 1254 Travelled with Ryanair from Murcia to Luton on 29 September and went through security etc. The plane was re-routed to depart from Alicante and we were told to go outside and wait for buses to take us there. No explanation was given. Some time later I did receive an email from Ryanair telling me the flight would now depart from Alicante at 12 midnight instead of the original 21.55pm from Murcia. We were not provided any proper instructions or checks and we waited a considerable amount of time, for just one bus to arrive and then it was a free for all to get on the bus. Some time later another two buses arrived and we were driven to Alicante airport. We had to go through security yet again and the flight eventually took off at 12.40am. The crew were very grumpy and didn't really want to serve you. In fact you felt that it was your fault the plane was delayed. We understand things happen and changes need to be made but keeping your customers properly informed should be your priority.
## 1255 London Luton to Murcia with Ryanair. The quality of service received was what we expected. We paid bucket shop prices and got bucket shop service, so no surprises there. The company mantra has always been 'you get what you pay for, so don't moan'. However, my complaint is about the way Ryanair treats its customers in that they don't provide accurate information (in most cases, no information) on delays, corral them like cattle and make them wait for very long periods outside in the rain (return flight from Murcia) with no regard for our well being. Ryanair has been a very successful airline mainly because of ticket price, but as the number of people travelling abroad is slowing down they may want to pay a little more attention to customer care if they want to maintain or improve market share. Price is now no longer enough.
## 1256 Flew Berlin Sch\303\266nefeld to Cologne/Bonn. Ryanair at its best, I guess. Very punctual and quick boarding. Paid 20 euros, which is absolutely unbeatable by FR's competitors Air Berlin and Eurowings. Paid 10 euros extra for seat 1A which - apart from the great legroom - turned out to be a good choice. Since FR's planes have stairs of their own and they hardly use buses for boarding I was first out of the plane and litteraly in my car 10 mins after touch down in CGN. And almost 20 mins ahead of schedule. This whole flight oozed efficiency, which is FR's core bussines. The only downside is that they use Berlin Sch\303\266nefeld: far from the centre and with the appeal of maximum security prison.
## 1257 Cork to Stansted. Regular traveller with Ryanair, not so much by choice but they are only airline going to Stansted which is near where I work. I have found nothing different about Ryanair since their effort to be more friendly according to their ads. The staff on the plane are generally unhelpful and unfriendly, the staff on the ground are the same and you can add "look disinterested". I have been a regular traveller for 18 years and I will try to be impartial so I must say they are generally on time. Apart from that one fact which is important they are a disaster as a service and god help you if anything goes wrong ie lose your ticket, passport etc or have a query. You will be referred to the website by the person on the ground and when you get on there you can talk to an agent on their webchat. I have done this a number of times and nothing ever gets resolved, you go round and round in circles. I recently had my passport stolen and did not realise this until I got to the airport. I saw the Ryanair help desk and it was like talking to a brick wall - no facial expression, not a care or desire to help. I had my Irish driving licence with photo id and my address on the card, but they said it needs to be a passport which they know I had stolen. I said you can check on my Ryanair account which shows clearly when logged in I had 4 other flights booked in the next 2 months plus the previous 100 taken in last 2 years, again just a sigh and no help. I feel that the staff really do need to be recruited better and trained to help and find a way to express themselves. You do not even need a passort to fly from UK to Ireland so what was the problem? I ended up catching an Aer Lingus flight back from Heathrow to Cork and what a treat that was - a far cry from Ryanair in every detail such a professional outfit. I tried again to contact Ryanair when back for my next flight to UK, but their chat line / phone and email (to which I had no response) was unsatisfactory and no help whatsoever.
## 1258 Porto-Barcelona. Landing was very rough, and it seems to be a regular occurence every time I've flown this airline. Seats very stiff and uncomfortable with no neck support, but I suppose that's what you get for the price. Most annoyingly, I paid to check a suitcase and it came out with zipper damaged and lock missing, but I only noticed when I got to my final destination so couldn't file a claim. Considering this, it was very poor value for money.
## 1259 Worst flight flying back to Glasgow Prestwick from Murcia with Ryanair. They never restocked anything, no coffee, tea etc.. Staff grumpy and just grunted, not the best English. Very disappointed. There was no where for a magazine or a sick bag to be stored and the plane was dirty. You would be better paying the extra for better service with drinks included ie BA.
## 1260 Flew from Bristol to Faro. Like a previous reviewer I too used 'passenger assistance' through Ryanair. The airline do not provide this but arrange it through the airport and whilst at Bristol the service was truly appalling (see my airport review), the service at Faro was excellent. The cabin crew were very helpful in assisting with loading luggage into the overhead bins and helping me to the front of the aircraft at Faro to await the 'lift'. It is not fair to blame an airline for poor airport service.
## 1261 Cork to Lanzarote. I am writing a review on behalf of my partially sighted 76 year old mother, who flew alone on flight FR9943 from Cork to Lanzarote on the 8th of Sept. 2016 to meet other family members who were already holidaying there. My mother who also suffers from a chronic back problem can not walk quickly, nor can she walk long distances requested wheelchair assistance and a person to walk her on to the aircraft to find her seat as she is incapable of reading seat numbers due to her sight. All this information is clearly stated on the boarding pass. EASY, SIMPLE, wouldn't you think, not so for Ryanair, my mother was wheeled to the departure gate area and left there. Eventually after a period of time she managed to make her own way to the departure desk to inquire what was going on. The person there literally man handled my mother and ran her down the gangway onto the aircraft dropped her luggage on to a seat and left just as the flight was about to leave. There was not one member of cabin crew helped my mother, other passengers on the flight helped her to find her seat, she put her luggage on the floor as she would be totally unable to put it in the overhead locker. As any traveller would image, a very uncomfortable 4 hour flight with luggage taking up the small space where your feet should be. On arrival at Lanzarote, she and another passenger with need of assistance were left waiting at the exit door of the aircraft for a very long time (I don't know exactly how long but it was certainly long enough for family to start worrying and try to find her, afraid that they had somehow miss her). My mother was so upset with all she went through, that she could not, even 2 days into her holiday relax and enjoy herself. Her flight home was changed (by family, an added unexpected expense) to a different airline, only then did she begin to enjoy herself. Ryanair, shame on you.
## 1262 Flew Ryanair Manchester to Barcelona return on 4th August and back on 18th August. I had never flown with Ryanair before, and was not expecting much with it being a low-cost airline. Entering the terminal (Manchester T3) we were annoyed to see that Ryanair checks in all their flights at the same counters, and that there was a huge queue, stretching all the way to the caf\303\251s nearby. We arrived two hours before the flight and the check in queue took over an hour and obviously we were worried about missing our flight. After getting through check in and security we were running to catch the flight even after being sent to the front of the line in security, thankfully we made it. Upon entering the aircraft (B737-800) I was shocked at how crammed the plane was with seats, the legroom was barely big enough to get to the seat (middle) in the first place, but for a 2 hour flight I could manage. After departure we were handed a magazine with a menu inside. The menu was basic and quite overpriced, but I was hungry so I bought a buttered croissant and a tea (same on the way back) for \342\202\2543. The flight attendants were kind, attentive and efficient and I received my food very quickly. The food was tasty and the croissant had been warmed. There was a little turbulence on the way, and my tea sloshed a little on me, and the flight attendant quickly helped me clean it up with a smile. After landing in Barcelona we had to wait 25 minutes for our bags to arrive. On the way back to Manchester two weeks later we were cautious and arrived at the airport 2h 30m before the flight instead, but check in and security were very fast and we spent nearly 2 hours in departures, and with big glass windows this was great for me, being an avid plane spotter. The gate was surprisingly in arrivals, and therefore we had to go through security again to get to the plane. After waiting for 20 minutes to board we, along with everyone else were directed towards arrivals, rather than towards the plane, which ended up in a big confusion for the airport staff. Like on the way, the attendants were attentive and kind and although we had major problems with ground staff the airline is very good value for money, and I would recommend it for those who do not have much money to spend on their flight, although if there is a flight with a different airline with a similar price, I'd pick the other.
## 1263 Stansted to Verona with Ryanair. Cheap airline and offers good value but we were surprised and shocked when we were hit with fee of 45GBP each for issuing the boarding pass. The ticketing agent was also rude. So make sure you print your boarding pass.
## 1264 We use Ryanair 6 or 8 times a year from Ireland to Spain or UK, and satisfied with service and value for money. This flight on 5 September from Shannon to Malaga was excellent. Clean, comfortable and on time. Cabin staff exceptional, pleasant, attentive helpful. Observed several instances of help offered with a smile. Very happy customers.
## 1265 My partner and I were due to depart Mallorca at 11:05 today. The plane was still unloading passengers shortly before 11am so a delay was inevitable. Once the plane had been loaded we were advised by the captain that we had missed the slot and would have to wait for another. We sat on the tarmac for a further hour without a single follow up message from the pilot. We never heard again from the pilots at all throughout the entire journey even once we had landed. At East Midlands, the doors were opened and we were then advised that no ground-crew were available to unload the plane so we again waited on the tarmac for a further 10 minutes. No point Ryainair blaming the ground crew like they did, the reality is that the flight arrived late at Mallorca and therefore late to East Midlands so should put the blame on themselves. I get that delays will occur from time to time, but to not even get an apology for the delays is ridiculous.
## 1266 Malaga to London Stansted with Ryanair. The plane had not been cleaned - immediate strong smell and faulty toilet on entering the plane. The floor of the plane was littered from its previous flight. Cabin crew asked cleaners to come on but none came into the plane and it was not cleaned. Passengers sitting nearest to the offending WC were advised it had been flushed out and would be OK, though the strong and unpleasant smell persisted throughout the flight. Cabin crew urged us to sympathise as they were having to work with the smell. They confirmed the state of the plane would be reported by them on landing. I doubt that Ryanair will respond. The crew members confirmed that Ryanair could be contacted about the uncomfortable flight but said Ryanair wouldn't do anything.
## 1267 My wife and two children missed a Ryanair flight to Stockholm Stavsta from Stansted after the baggage check in was slow. They joined the baggage queue 110 mins before take off. Not enough check in staff. No sense of urgency apparent. She complained and was asked to pay again. The whole family is very well travelled and have never missed a flight before. We lived in Nigeria for several years and experienced many African airports. Even before getting to Ryanair check in I was shocked. The toilets and the chaos! Fly Ryanair again? No. Stansted again? No.
## 1268 Ryanair flight from London Stansted, to Milan Malpensa. Tickets were very cheap so it didn't really mater about the flight quality. Ground service was decent, we had online checked in and so we jumped the queue. Flight was on time, and boarding process was relatively easy. Flight cabin was clean and new, one of the newer Ryanair jets. Flight was fine, no food and drink served, but for the price we paid, it was absolutely fine. Was a short flight, 2hrs, and overall a pleasant experience. Overall, I would recommend Ryanair to anyone flying short-haul, especially if the price is cheap.
## 1269 London Stansted to Nuremberg. Asked for assistance at Stansted airport for my autistic son who has great difficulty dealing with queues and large crowds, an email was received saying this would be given. The staff at the assistance desk ought to be ashamed of themselves, I was spoken to rudely and no meaningful help whatsoever was offered, they were uncaring, uninterested and inept. Ryanair ought to be ashamed. There were bodily impaired passengers sat in wheelchairs who mentioned to me that good luck getting any help, we have been waiting here hours. In the end I had to sort the issue out myself, numerous kind and understanding Stansted airport staff said to me that Ryanair are not doing their job and were more than willing to assist. Having flown with Easyjet with the same scenario they were superb dealing with this situation. Typical flight - got on-got off - can't ask for more than that with, in fact the flight crew were fine.
## 1270 Liverpool to Nimes. I'm happy with Ryanair's budget approach, but over many years of using their flights there's been a consistent changing of goal posts that inevitably disadvantages the customer. These do not seem to be writ large all over their website. My latest encounter involved printing boarding passes. I do both the mobile and the printed- belt n braces kind of approach. I was printing the passes from saved pdf files which displayed all images and the barcode perfectly. The boarding passes printed beautifully except for the barcodes. I altered every possible parameter on the printer, even printing as a super-fine image, with the same outcome ie perfect adverts, lovely table for the barcode info, crisp text, but the barcode a grayed-out blur or totally absent. I went online to their 'chat' - 'well i don't know change your printer' : I phoned customer service - 'use a different browser' - nobody else boarding that flight has had this problem so it's your fault'. Being an OCD sort I actually scrutinised the pretty-looking boarding pass I printed. Unlike earlier iterations, the barcode is now a smaller element of a foldable page stacked with big, colourful adverts. Many users may glance at this and not notice that the barcode is wonky or absent. Most customers will now, I guess, be using the mobile app. Which means that it looks like Ryanair have spotted a niche market represented by the digital divide - ie, if you aren't technically aware, and don't own a smartphone, you'll get 'fined' at check-in. Be interesting to see if any other customers have also experienced this. It interests me that in neither of my encounters with customer advice did the operative advise me to use the mobile app instead - which is the logical answer. In both encounters it was the usual Ryanair indifference plus assigning blame to 'stupid customers'.
## 1271 Excellent flight again from Ryanair flying from Glasgow Prestwick to Murcia. If you carefully read the T&C's regarding online check-in, etc you wont have any issues. Flight on time on journey out, and landed 35 minutes early on return. Food & drink costs at a par with our airlines. Staff pleasant and helpful.
## 1272 Fuerteventura to Glasgow Prestwick with Ryanair. They claim to be a cheap and cheerful airline, until they hit you with all there add ons and not so cheerful staff. On our flight home we queued at our boarding gate for 40 minutes which I assumed was because the aircraft would be getting cleaned from the flight that had just arrived. But no, there was crumbs and sweet wrappers all over the floor. Aswell as the staff ignoring the mess on the floor another member dropped rubbish off one of the trollies and just left it, then continued to step over it every time she walked up and down - pure laziness. Staff weren't very welcoming at all, never smiled and everything seemed like a struggle. Wasn't happy at all with this flight and as this is the first time I have flown with Ryanair it is very unlikely I would fly with them again.
## 1273 Flew from Thessaloniki to Stansted. We had already taken the time out of our holiday to check-in online for our return flight and print off our boarding passes. But we had 1 hold bag to drop off which we assumed would be a simple bag drop at the airport. We were wrong. We had to queue for an hour to check this bag in as there were only 2 desks checking in all Ryanair flights at the airport. We should not have had to queue at the check in desk to drop a bag when we had already completed our online check in. To our horror, we then had to queue for another hour to drop the bag as the airport doesn't take your bag from the check in desk to the plane on the usual belts (but that's not the airline's fault). There were two further queues at the gate to board the plane. With all the time wasted we had no time left to get our evening meal (we had allowed a generous 3 hours before our flight but it was not enough time). So we were relying on the cabin food once onboard. But they had run out of everything. Only a few pain au chocolat, crisps and coffees were left to share around all passengers onboard. I felt as though we weren't paying customers but instead should be grateful for the disgraceful service we did receive. It was an incredibly stressful experience and I will not fly with this airline again if I can help it.
## 1274 Thessaloniki to Karlsruhe/Baden-Baden. When I arrived at Thessaloniki-Airport only 2 baggage-drop off-counters were open for more than 3 flights so the queue was very long ! Boarding was quick and flight was on time. The cabin crew were friendly and the aircraft was clean. The legroom was acceptable. There is no inflight magazine available anymore. I bought a sandwich for 4.50\342\202\254. It was very delicious but 4.50\342\202\254 is a little bit too much. The ticket price wasn't really cheap although it is a low-cost airline.
## 1275 First time I have been on a Ryanair flight flying from Nuremberg to London Stansted. Departure in NUE always is nice as the terminal is small and the ways short. As we had cabin baggage only I can\342\200\231t rate ground handling of Ryanair in NUE. The boarding for Ryanair is always efficient. I had to drop my trolley at the aircraft due to full cabin which was a bit annoying. Since you have seats assigned boarding is absolutely comparable to any other airline. Once in the cabin you need to get used to the strong colors. The seats are absolutely sufficient for the 1,5 hours to STN. Announcements had been in clear and understandable English. Take-off was on-time and the flight to STN was absolutely smooth with a safe landing in STN. As usual there is service against charge onboard as well as Duty Free. After landing the baggage was available at the baggage claim immediately and we left STN approx. 25 minutes after landing. Flight back to NUE was comparable. The crews on both flights were very nice the time you saw them. Ryanair is a great and safe way to fly.
## 1276 Liverpool to Faro. Overall I found my flight with Ryanair to be average for a low cost airline. The tickets were cheap and worth the money. However I was not very pleased with the new Ryanair cabin, the seats were rock hard and had poor legroom. I personally would have liked to have seen some level of inflight entertainment, especially for the three hour flight I had to endure.
## 1277 Bristol to Kaunas return. Brilliant flight and staff. On the way back we paid for a seat in front of us because there was 5 of us and we wanted to sit together. This seat costs \302\2438, and half way through the flight my mums partner who was sitting in that seat had to move to the back because of a woman with back problems. What is the point in paying for a seat which you can't even sit in? We paid for it for a reason, so we can all sit together. The lady with the back problem should of sorted this out at the start of her holiday and asked for the front row seat, where she could of laid down or whatever.
## 1278 Manchester to Alicante. We checked in months before online and also paid for fast track security. No fuss at all, straight through check in and on to the plane. Got us in the air in no time and were very funny at the same time! Got to Alicante on time.
## 1279 Prague to London Stansted with Ryanair. I have flown on this route about 6 times this year and have consistently been very satisfied with Ryanair. There are 3 other budget airlines which I could choose but Ryanair's fares are always the cheapest. They allow a cabin bag plus another small bag (e.g. laptop), which is generous for a budget airline. They boast about a 90% on time arrival (within an hour), and given my experiences I can believe it. I have been delayed once and that was because all flights were grounded due to weather. The staff are fine, friendly enough. Boarding can be a bit chaotic, and I would recommend paying the small fee for priority boarding (note that this does sell out, so do it at time of booking rather than a later add-on). Personally I don't care about in-flight entertainment, magazines, or drink services, so I won't make any judgement based on those (which is good, because they are either non-existent, or average at best). If you want a good trip here is what to bear in mind. Have expectations that match the price - this is a budget airline that tries to deliver best price by having no-frills. Read the rules and stick to them. Cabin bag dimensions are a bit smaller than usual which can catch you out. Only 20cm width as opposed to normal 25cm. Would have caught me out once but fortunately they didn't check bags at the gate. Be sure to check in online prior to arriving at the airport. They do not have check in desks, and if you haven't checked in you are setting yourself up for a hefty penalty. Only the first 90 bags will be boarded, the rest will be put into the hold free of charge. This means that if you insist on carrying your bag, you will have to queue up at the gate to make sure you are one of the earlier passengers to board. If you sit down and wait, go for a coffee or whatever, and then board later, you are not taking your bag on board. The only thing I wish they would change is to remove the bright yellow colour scheme from the cabin. Maybe it's branding, but it just lends a tackiness to the whole experience that seems unnecessary. I am sure they could adjust their brand to something slightly more tasteful. Overall I have to give them top marks. I am not sure they are the best choice for families with small children, but if you're a single traveller or a non-fussy couple/group, and you want to get from A to B cheaply, you won't beat them (on this route, at least).
## 1280 Ryanair provided one of the most efficient and enjoyable flying experiences I have had. I flew from Dublin to Malaga, and returned via Liverpool (Saved bout 90 Euro a head) The flight was the usual. This was the older cabin, not the new one. The seats were okay, leg room is what you would expect from a budget airline. The staff were friendly, and helpful - better than other budget airlines I have flown with. Checked luggage no bother, they even took one of our carry on for free at check in - happy days. The boarding was efficient, jammed up a bit once we were on the plane, but otherwise it was fine. They took another carry on bag from us at the gate. We pushed back on time, and were airborne shortly after. I indulged in some nuts and a coke. And had brought a bite with me from the airport, so that was my main meal. The selection on board is good but pricey. To my dismay, they no longer have the Trip magazines that they had had on my previous flights. The crew were very attentive. We arrived a few minutes ahead of schedule which was great. We disembarked and got our luggage no bother. I would put them way ahead of every other European budget carrier, and maybe even ahead of a few other mainline airlines. My return flight was a mirror of this, although a 4 hour lay over in Liverpool, same nuts and coke and the same window seat.
## 1281 If you are looking for a budget airline with cheapest air tickets, this is the company. My flight was only one hour from Manchester to Paris, Beauvais and Using Ryanair for the first time, I had no complaints. But I would never use them for long haul flights as they don't have any inflight services and a very watery coffee is about \302\2433 per cup.
## 1282 Athens to Mykonos. I'm the not the type to write reviews good or bad, but after being conned into using Ryanair I had no choice. This airline will nickel and dime you to death. That is where they make their money. The fees they charge for checking in and overweight bags are astronomical (more than my flight cost). They only allow 15kg for bags. 18 euro charge per kg overweight! Check in fee of 55 euro. Do not be fooled by the cheap"flight cost.
## 1283 Barcelona to Rome. Take note of checking in online prior to your flight else you have to pay an arm an leg to get your boarding pass printed at the check in counter, which was expected of a normal airline check in. To make the situation worse,\302\240the 45 euro / pax penalty was not stated during the purchasing process or on our etickets. After queuing for almost an hour at the check in line of Ryanair, we were slapped in the face by an impatient check in officer who just rolled her eyes and\302\240 said that 'sorry the online check in just ckosed 2mins ago'. And rudely shooed us to the other counter to make payment as she hurried to attend another customer. She said no payment, no boarding, and just shrugged her shoulders. To rub salt in the wound, We were told we could have checked in while waiting in the queue. How would we have known when there was no signage whatsoever while we were queuing. At the 'payment counter' there was another 20 mins queue with more than 30 other passengers paying their penalty. What a great way to easily earn a few thousand extra euro per flight. Anyone who travels will agree that wifi can be inconsistent and even unavailable for a period in a foreign country. After boarding, flight was dirty with food bits and paper on the cabin floor. One of the worst flight experience in my 20 years of flying.
## 1284 Belfast to Gatwick. Another Ryanair flight and another review. Again, for under 20 USD I had a good flight. It was paced and cabin crew looked tired but still remained helpful. We were delayed for around 30 minutes but this didn't seem to impact many on this point-to-point trip.
## 1285 The plane was very dirty with crumbs/wrapping on seat and floor. I'm sure this is due to the 2 hour delay for boarding and turn around time. Captain made PA-regulation/restrictions would not allow us to push back for 45 minutes (crew laughed at this PA). This seems like more than enough time to clean a plane. Female crew in the aft of the plane giggling through their safety demos, looking behind at the other female crew and making jokes. A lady pressed the call bell and I could see the crew ignoring it and eating crisps instead. What if it's a medical emergency? When she finally came to check she was still chewing. Crew were running through the cabin, with scratch cards laughing at 1am. No hot food, no tea available. The crew found this hilarious and kept laughing when people complained. It took 1 hour+ to get to row 25 with a drinks cart. The crew kept using the call bells during service even though people wanted to sleep. One female crew could not even form a sentence toward the end of the flight. During all her landing PAs she was laughing. She had to stop and start two safety PAs because she could not stop laughing. All the crew were having a fantastic evening. The customers however, after 3 hour delay and terrible customer service were not. Then as we left the plane the crew didn't even look up or smile. We were a total inconvenience.
## 1286 London Stansted - Bucharest return. Two of my most pleasant flights with Ryanair. It's amazing how much the airline's customer service has improved in recent years, particularly with their allocated seating, extra cabin baggage allowance, use of primary airports and excellent mobile app, features, all of which, have significantly enhanced the overall travel experience. In addition, it is pleasing to see that Ryanair have begun using satellite 2 in Stansted for some of their flights, which offers a far more relaxed boarding experience, along with much more space and seating compared to satellite 3 (which is the main gate area from which Ryanair flights operate). Ryanair should definitely consider making more use of this facility, as it is very underused and often empty for long periods of the day. (In fact, there were only 3 flights operating from there when we flew out). Onboard, I noticed that service has improved too, and there are no longer as many tedious announcements as before, particularly on evening flights. On both flights, cabin crew were very friendly and professional. Clearly, Ryanair have come a long way since their improvement plan started, and I wouldn't hesitate to fly with them again. The only thing they could improve on now is to make use of other gate areas that are not so cramped/small, especially in STN.
## 1287 Bournemouth to Malta with Ryanair. I have now flown several times with Ryanair, and I can say that my flights have been problem free, on time, and reasonably pleasant. The trolleys trundling up and down get tiresome, but you get what you pay for, that's our choice. The coffee / tea that is sold is diabolical. The coffee grinds come though the filter and stick in your teeth, and the milk is the now the obligatory insipid semi skimmed culminating in the most awful coffee i have ever tasted. The attendant changed it for tea - undrinkable - back to the attendant who was very apologetic and commented that WE should write and complain as he had had several complaints. No luck on the Ryanair website so here I am here to warn future passengers of \302\2432.60 for a cup of dish water.
## 1288 Brussel to Berlin Schonefeld with Ryanair. This is one of the cheapest airlines I have ever seen. For a 1 hour flight it was so worth the money, didn't have to wait too long. Cabin crew seemed slightly annoyed, I am not sure why. Seat was fine, I am a tall person so legroom would mostly be a problem but I had just enough legroom, so that was great. Food and drinks were expensive, although the coffee is reasonable. There was no in flight entertainment and no WiFi, but I didn't need those things because it was a short flight.
## 1289 I frequently use Ryanair when travelling around Europe as they have the best route network and are by far the best value for money. My last flight from the UK to Germany only cost \302\24320 return, an absolute bargain. The customer service too has seen a massive improvement over recent years with allocated seating, increased baggage allowance and a refreshed look with the new crew uniforms and cabin interiors. The cabin crew on my last flight were both friendly and welcoming and seemed to engage well with the passengers. The food and drinks on-board are pretty expensive as you'd imagine although on occasions have been cheaper than that offered in some of the airports I've been to, mainly in southern Europe it would seem. The only annoyance, especially when travelling without checked-in bags, is if the ground crew tag your cabin bag to go in the hold due space limitations, although on my last couple of flights the haven't done this and the crew were very accommodating in getting everyone's bags in the overhead lockers. Streets ahead of easyJet now as far as I'm concerned and overall a fantastic airline which I'm sure will continue to use regularly.
## 1290 Flew from Manchester to Barcelona. Due to travel back with Ryanair tomorrow morning but received a text at dinner stating flight has been cancelled. No flights available with them for the 3 consecutive days I've checked, I run my own business as does my partner. Now searching airlines to get home on Wednesday and not Tuesday. That's 2 days worth of clients let down.
## 1291 I have heard many poor reports with regard to Ryanair. I am happy with my flight from Lisbon to Manchester we were delayed by 15 minutes due to airport congestion (not Ryanairs fault). Very impressed with seats and space and well done in not having the magazine pockets in the seat in front, I travel a lot and get fed up with with the pockets being used all the time and disturbing my travel, and pinging in my back. The cabin was clean and tidy, we did not have any food but had some Lavazza coffee which I have to say is the best I have tasted for a very long time. The coffee served on Jet2 and Thomson is undrinkable. Would travel with Ryanair again.
## 1292 Luton to Gran Canaria with Ryanair. This is the worst airline I have ever flown with. Changing flights online is near impossible and their customer service calls cut out half way through on 4 occasions. The staff are generally unhelpful and rude. The worst flying experience ever. Even if I could say I paid peanuts it would be some sort of justification - but we didnt, we paid a competitive price and all the added extras are charged for so it was above competitive rate for a less than budget service. Very, very poor - absolutely no value in this company.
## 1293 Dublin to London Gatwick with Ryanair for a connecting flight to Guernsey. The experience I had was pretty poor, When we finally managed to board the plane we were greeted by an overheated claustrophobic cabin. The plane left late, which seems to be the norm and we found the experience to be very stressful. This was bad enough but the return journey was worse - we boarded the plane about 5 minutes before the scheduled departure time and eventually departed over an hour late, no apology or explanation as to why. The consequence was that we were 2 hours late returning to Dublin and missed our pre-booked transport to Cork and had to wait an hour for another connection. I am annoyed about this mainly because as I have stated there was no apology or explanation as to the delay, needless to say I wont be using this airline again.
## 1294 Flew Prestwick to Lanzarote return, 14th-25th June. We were delayed for 1 hour at Prestwick due to the French ATC strike, not Ryanair's fault, both our flights were fine, staff polite and friendly, I had our boarding passes on my phone, so no problem there, (I still can't believe some people still insist they didn't know they need to print their boarding pass, I wonder how some of them managed to book flights). Once again good flights at a great price, I will continue to use Ryanair.
## 1295 I read some poor reviews of Ryanair before my trip, but I didn't pay much attention to them. I wish I would have. I will never fly Ryanair again. We had three flights - Dublin to Paris, Paris to Shannon and Shannon to Gatwick. Every flight was terrible. The staff were rude and very unhelpful - especially the check in staff. The flights were all delayed, planes were dirty and seats uncomfortable - they were more concerned about selling raffle tickets than attending to passengers. It didn't even end up being that much cheaper to fly Ryanair than our other options anyway because you have to pay for each seat and each bag that you check. It was a terrible experience that I will never repeat.
## 1296 We flew from London to Copenhagen with Ryanair, flight could not depart on time from London because of different excuses Ryanair pilot kept announcing on the plane. First it was bad weather, ten minutes later another plane had an emergency landing and we could not leave yet. Next, we were waiting for airport clearance, so about one hour later we were finally in the air. While in the air I asked Ryanair personnel what can I do about my connection because we will arrive late. All they could do is tell me it is not their fault we will be late and they cannot call the other airline to announce that we are running late. They did not care what would happen to us. They also told me to go to their Ryanair office in the airport to sees if they can help. When we arrived at the airport we found out Ryanair does not have an office in the Copenhagen airport so we were left in the airport with no help. I will never recommend this airline to anyone.
## 1297 First time flying with Ryanair from London Stansted to Lisbon and I was impressed. Everything went smoothly from booking to boarding. The flight was on time. The cabin crew were friendly and professional. The food was terrible and I will bring my own next time I fly with them. A good airline based on my experience.
## 1298 Opted for Ryanair to fly Liverpool to Malaga and back rather than preferred easyJet on grounds of timings and price. Booked the return flight separately as paying in euros saved money, even using my credit card. Had problems trying to check in online as our computer does not seem to like the new Ryanair website and in the end could only do so via the old so-called Legacy website, only to discover that airport security and boarding gates struggle to read the boarding codes. Outward flight was fine and everyone seemed to get their hand luggage on board despite the flight being full. The return journey was less satisfactory. It was delayed by an hour with no explanation or apology given. Boarding at Malaga was in 3 groups: priority first, then rows 22 - 33, then everyone else. We could see that it made sense to board the back rows first when using an airbridge, but some prior warning would have been helpful as the existence of the display notices indicates that it is Ryanair policy. Then as the rest of us were boarded, the boarding agents immediately began to tag our cabin baggage for free hold storage without any warning, which necessitated extracting items wanted on board as we waited beyond the gate. It seemed that there must have been a pre-determined number of passengers to be selected for hand luggage removal as those at the back of the queue were allowed to keep their bags. In fact, as there was a large school party on board with minimal hand luggage, there would have been plenty of room for everyone's bags. We couldn't help feeling unfairly treated as we were near the front in the original queue, but relegated towards the rear and then selected for baggage extraction as well. The flight itself was ok, though we do find Ryanair seats rather numbing after a couple of hours. Those who ordered food, however, were very discontented as it took so long to appear - some did not get theirs till the descent into Liverpool had already begun.
## 1299 Bristol to Dublin with Ryanair. Overall a satisfactory performance. Flights both ways were on time and the sectors were short. Cabin crew very interested in selling you things and were rushed off their feet from take off to landing but were nevertheless professional and welcoming. The seats literally felt like cardboard and were squeezed in together, however from a cost saving point of view and fast turn around times I can understand this especially on a short sector. I would recommend Ryanair as an airline that does simply what it says on the tin no more and no less.
## 1300 Fantastic flight out to Alicante with Ryanair, I am nervous flyer and spoke to the pilot and crew before we left they were absolutely were excellent and professional. Smooth flight and crew kept us informed. Ran out of drink on the way there mind you but that's expected on a busy flight to Alicante. Flight back again was smooth and again fantastic crew especially one crew member who gave a speech at the start of the journey stating that they hardly had any alcohol left but to make up for it they would take is to the Bahamas instead of Prestwick all in good humour. Only downside was the head steward who could have done with smiling a bit more and putting more effort in with customers like his staff. Would definitely fly again.
## 1301 I twice used Ryanair for flights between Madrid and Porto. All flights were on time, the planes were clean, no surprises with checked bags and cabin bags since I purchased their "Business" option. Lines at both airports were quite bearable - up to 8 minutes each time. Onboard service was polite and professional. I wouldn't call these flights "pleasure", but there was nothing irritating. If you carefully read all the rules, you have no trouble. Boarding in Madrid was via finger, boarding in Porto was typical low cost outdoor queuing and lining. In rainy weather it wouldn't work well. Overall ok.
## 1302 London Stansted to Wroclaw with Ryanair. On the plus side it was fast boarding, arrived half an hour ahead of time, nice staff, fully Polish crew. On the downside are the high prices for things to buy on board and little legroom.
## 1303 Frequent flyer with Ryanair, and have never had a problem with them. Problem lays squarely with the handling at Manchester Airport as they are simply dreadful (Swissport). Flew Dublin to Manchester. Flew back on EI-EVO, which was clean and tidy with plenty of legroom (however not as much as the newer aircraft with Sky interior - flew out to Dublin on EI-FRR). Fantastic cabin crew who were enthusiastic about taking care of passengers and flight crew who gave us excellent updates on a 35 minute flight. Left Dublin 35 mins late due to slow turnaround at Manchester - however arrived 1 minute early. Will continue to only use Ryanair in the future (not flown with anyone else for nearly 5 years, I have no reason to change allegiances at all) and even get my flight-sceptic fianc\303\251e on board too! Keep up the good work.
## 1304 Another contented trip on Ryanair from London Stansted to Rome. Fantastic value for money but having a checked bag was just short of another fare of the same value. Good on board service both legs. Ryanair have definitely demonstrated in recent times that they can be top of the low fares market. A three hour delay on the homebound leg did not put us off although lack of information and continued departure time changes irritated many others. The crew worked hard on the full flight and meal deals are of reasonable value.
## 1305 I have avoided flying Ryanair for probably 10 years due to previous experiences. However, I found a very cheap one way flight from Faro to London Stansted and couldn't resist. I paid for one large bag while checking in. We planned to take a second bag as a carry on. Check in was very easy although there are still quite a few extra things they give you the option of purchasing at the last minute which can be annoying. Got to the bag drop at Faro and was very surprised to be asked if we wanted to check the second bag in free of charge. Apparently they do this if the flight is not full. We sat near the back of the plane and had the three seats to ourselves. I really like the seat allocation as this has completely eliminated the mad rush that I remember. We didn't have anything to eat or drink as it was a short flight but we did buy our coach tickets from the FA and saved a few pounds. All staff encountered throughout were very friendly and helpful. The whole experience was a massive improvement on previous trips. I was very reluctant to fly with Ryanair but after this trip I have completely changed my mind . I would definitely use them again but it would depend on the price. It is very basic but perfectly acceptable for a short flight.
## 1306 Flew Ryanair from Palma to Liverpool. Staff pleasant and polite, new uniform looked good. Late departing on outbound journey due to FMC not starting as there was a power cut on the ground at LPL. Flight was good but arrived 1 hour late (departed 105 mins late), inbound flight 35 minutes late due to ATC restrictions, but we made up time and arrived on time. Need to remove yellow bulkheads from aircraft as they're annoying and were meant to be eliminated as part of the 'always getting better' scheme. Need to improve refreshment quality as filter coffee awful. Very cheap, \302\243150 in total for 3 adults and one child (inbound and outbound).
## 1307 The flight from Berlin to East Midland Airports was on time. This is the first time I have flown with Ryanair and I paid for business plus which was a total waste of money. I was expecting what they advertised, priority boarding, no hassle on checking-in lugagge and security. In fact, I was had to queue up like usual to check in luggage, I did jump to their so called "BusinessPlus" counter to ask where to check in, staff asked me to stay back and wait, and nothing happened. When I was about to go into the priority boarding area, staff stopped me and asked me loudly: "you have priority?" When the bus came and we are about to board priority staff again stopped me and asked me again, "are you in priority?" I did have priority boarding but not on the plane, but only on the bus that transported us to board the plane. So when boarding the plane, we still boarded as usual in a long queue. The seat onboard is normal and I was sitting in the front row near an aisle, which was really annoying as the corridor was so small and people kept going to the toilet located just in front of my seat, and therefore, I could not enjoy the "long leg room" as the space is just too small. Overall, Ryanair is economical to fly with but remember, don't waste money on upgrading especially Business Plus which is a totally waste of money. From my experience, you don't get priority on luggage checking in, security, boarding and thus, it is just a money rip off.
## 1308 East Midlands to Limoges with Ryanair. I was expecting a poor service, and this was seemingly confirmed by the slow and tedious check-in. However, everything from then onwards was very good. My mother had assisted passage which was very useful due to the long trek at East Midlands airport to the Ryanair terminal and the airline staff were all helpful and professional. The aircraft looked to be nearly new and it was on time. Food was quite acceptable and certainly no worse than available on other budget airlines. Because Ryanair is the only airline offering a reasonable price (not cheap at around \302\24390 each) to the location I want to travel to, I will use them again. Overall a pleasant surprise being better than expected. 7 out of 10.
## 1309 Flew with Ryanair for first time with friends from East Midlands to Murcia - they booked flight and paid the extra for extra legroom seats, baggage, golf clubs and priority boarding. Flight on time but the very hardest landing ever in 40 years of flying. Very hard uncomfortable seat cushions but worth the extra for the legroom - more than 2 hours in one of the normal seats would be horrible to anyone over 5'7" or so. Baggage off promptly. Return flight 20th May uneventful. Took off on time and landed at EMA on time only for Ryanair to spoil it by not ensuring busses were ready to transport us the 25 yards of so to the Terminal. Their stated 25 minute turnaround time was ruined for the next flight. Ryanair did what it said on the tin - if you follow the rules and watch weight allowances, hand baggage size etc you'll be fine. We will be trying Ryanair again with some American friends in September - let's see what they think. Finally, could really do without the hard sell of lottery tickets, and a Duty Free (In Europe?) run. And as for the stupid fanfare.
## 1310 Malaga to Manchester on Ryanair. Unhappy with the customer service and attitude of the staff. When my flight was cancelled I was surprised with the lack of empathy and assistance that Ryanair staff offered. They did organise an alternative flight, however ignored my friend and I on numerous occasions, sent us running around the airport looking for our luggage without direction, shouted at other flyers whilst they were attempting to organise their return, did not offer food and drinks vouchers and were just unhelpful. Our luggage was left abandoned in Arrivals with no supervision whilst other desks were manned. It was a very scary experience for me never having a flight cancelled before. On my rescheduled flight boarding was delayed by 40 minutes as the check in staff did not offer hand luggage to be stored in the hold and the flight staff again looked very unhappy in their job resulting in a very depressing flight home. I expect better and would reconsider flying with them again.
## 1311 Leeds to Fuerteventura return in May, excellent both ways and good service. Nice cabin crew, landed early on both flights and for the price I paid an absolute bargain. I will fly Ryanair again. The way they get aircraft turned round is a bonus for passengers.
## 1312 Manchester to Bratislava. Ryanair have much improved since I last flew with them around 5 years ago. Cabin crew both ways were friendly and their new uniforms look the part. The two bag policy is good and it sets them apart from other carriers and I'm glad they no longer micro examine the size of every carry on bag in the hope of eliciting some more money for a minor infringement - but truth be told, they've a lot of ground to make up on other low cost carriers who started to improve their customer experience long before Ryanair did. The seats are uncomfortable and cramped. No seat pocket annoys me and puts me off buying anything (still way overpriced). As does the broken tray table with a 45 degree slant meaning anything placed on it rolls into your lap. The fan fare on arrival irritates and is frankly crass. The seat rest and overhead bin adverts make remind me of a bus. The toilet is cramped. The occupier of the aisle seat next to me had a bag that didn't fit under the seat in front of him resulting my having to clamber over it to get out mid flight. That'd be fun in an emergency. I know they are upgrading their fleet with new seats and interiors and I realise they make a lot of short journeys so wear and tear is inevitable, but Easyjet manage to provide more comfortable and clean aircraft with a better environment so why can't Ryanair? Particularly as their prices are no longer quite as competitive as they were. I'll use them again where I have to but given a choice of paying 1/3 more and travelling with someone else, I will.
## 1313 Short european hop from Madrid to London Stansted with Ryanair. Check in on-line and no baggage. Slight 20 minute boarding delay and first 90 or so bags allowed free onboard. Quick departure and a very slow cabin service. Not sure why the crew took so long this time but they looked very smart, good presentation and interested in the service and customers. Had a 10 euro meal deal which was not bad value for money. Arrived a few minutes late and quick exit. Fantastic value for money at 55 euro single. Overall and once again, I am more than satisfied by Ryanair.
## 1314 Never been a huge fan of Ryanair from past experiences but I acknowledge they provide an A-B service at a generally good price and that is why they are so popular. I wasn't expecting much from this recent trip I made from Stansted to Gothenburg but I came away feeling I'd do it all again if this is what I can get for my money. On time flights, clean airplane, friendly cabin crew and excellent choice of on board products. Yes, they are a hard seller and the rules are what they are, but we should all know that by now, and for the price you pay nothing comes close. If you want a weekend away in Europe at a low price why would you look elsewhere?
## 1315 I flew with Ryanar on Friday (29/4/16) and Monday (2/5/16) from Brussels to Pula and it was great experience. Crew were fantastic. I don't know what other people are complaining about, for such a low price, I couldn't ask for more. A passenger in front of me almost fainted and the crew helped her in the best possible way. Seats aren't the best, the plane doesn't look the best, but for the price I paid, it was worth it. I'll continue to fly with Ryanair as I had no complaints.
## 1316 Dublin to Malaga return. Outbound on new aircraft with new interiors, and found seats comfortable with thankfully still no recline, leg room decent for flight duration. Malaga based crew were very good and friendly. Return trip on older aircraft, again a very good Malaga based crew who looked after all passengers very well. All flights on time and great price. Delighted to see end of former let's make travelling as much hassle as possible business ethos.
## 1317 Flew London Gatwick to Belfast International. The flight was on time and as I had business plus I was able to pass straight through priority security which was a breeze. We were on a new plane with the Boeing sky interior, which is so much better than the older interiors. The legroom was good I thought for a short haul (I'm 6 foot 4 and could move my legs). Crew were very friendly and professional throughout the flight. We were on time as always with Ryanair, and for \302\24320 return I can't complain.
## 1318 Good to see the customer service improvement continues. Ryanair flights from Girona to Stansted on time and arrived early in both cases. Crew on both flights helpful, efficient and friendly. The petty rules and surly attitude seem to be things of the past. I never thought I'd see myself saying this but not only is flying Ryanair cheap, but actually becoming quite pleasant, as opposed to an ordeal. Long may it continue.
## 1319 I flew Ryanair from London Luton to Malta in Business Plus. What made the difference and prompted this review is that they have introduced priority bag drop at Luton. When this is combined with an extra legroom seat and priority access through security, I would have to give the service 9 out of 10.
## 1320 First flight from Athens to Thessaloniki full due to air controllers' strike in Greece, however boarding was on time, lots of hand luggage were given to the hold before boarding the aircraft and everything happened according to schedule. Crew were particularly cheerful on this flight and there was a good vibe. On the return flight I was seated in the back, changed seat without asking, as there were a few rows empty. Quick disembarkation, crew tried to make sales a lot but I don't think they sold anything. As this was a very early flight most passengers were sleeping. This is a very short flight and everything went according to schedule.
## 1321 GLA-DUB day return. Tickets a bargain at \302\24320 for both flights. First flight was on one of the newer 737s with the Boeing Sky Interior. Good legroom and the seat was comfortable enough for 40 minutes. Flight left a little late but made it up on the journey. Dublin Terminal 1 is a bit labyrinthine but that's hardly the fault of the airline. Crew friendly, didn't really interact with them to be honest. Flight home on a plane with the old interior. Once again a bit late leaving but landed on time. Seat fine again, but was getting the early pangs of backache so keep that in mind if you are booking a longer flight. Did notice that the crew were very frequent in announcements flogging duty free despite barely having the time to do a drinks run, but that's with the territory when you fly low cost, if that's an issue bring some headphones. Overall would fly again, especially for the money I paid.
## 1322 Seville to Dublin with Ryanair. Loud creaking noises from overhead luggage bin on take off. Following by 3 hours of cold air blowing directly on my head. I was seated in aisle seat 11D. My wife was seated in 11E. Reported issues to cabin crew repeatidly by myself and a lady passenger in our same row in seat 11F. Crew requested pilot to turn up temp in cabin 3 times. No concern expressed by crew regarding noises. Cabin became too hot after 3rd request by crew to pilot but cold air continued to blow from overhead. Crew did not at any point check back with me to see if matters improved. I suffered severe headaches after landing.
## 1323 We were contacted by Ryanair at 1am with news that our flight from Alicante to Birmingham was cancelled due to French Air Controller strike. Despite given a helpline number we were unable to get through. The information at the airport was poor. A queue of about 100 people with 2 people on the desk. People had been in the queue for over 3 hours. Seats were not available for at least 6 days. On our return, information and support from the helpline was very poor . We won't be flying Ryanair again.
## 1324 Cork to Malaga with Ryanair. Our journey started at check in desk in Cork we had booked priority with Ryanair but we still needed to queue up with the other passengers considering there was only one desk open. We then went through security which was surprisingly empty and staff there were friendly. There was a fifteen minute delay that was understandable when we got to the gate we boarded with priority but once we boarded the aircraft it looked like a rubbish tip. There was rubbish under all the seats which was all the litter from the inbound flight. I expect the aircraft to be clean and tidy for the next departure. Once the aircraft was airborne the cabin crew came around with the food I ordered a breakfast, and it was awful.
## 1325 This was the return leg of our flight after our day trip to Copenhagen. I like that they don't hang around, when boarding the plane it is very quick. My seat for this journey was a window seat, 10F by the engine. As with the trip out, the service onboard was good and staff friendly. I didn't eat on this trip just water, so can't comment on the food. We arrived back in Luton only 5 minutes late, but missed our bus home due to immigration delays. Overall for what we paid for these flights we were both happy with the plane the service and the trip.
## 1326 Dublin - Berlin Sch\303\266nefeld - Dublin with Ryanair. Very impressed with their new-found improved customer service experience. Smiling, attentive, engaging and happy to serve customers and deal with their queries and requests. Travelling with a sick passenger on return, the flight attendant was extremely helpful, concerned and reassuring. Baggage rules are now relaxed and gate staff were very willing to check in bags for people who wished to. I've been quite reluctant to fly with them in the past but this reticence has now been put to bed and would be more than happy to fly with them again. One point lost due to crammed waiting area at Sch\303\266nefeld.
## 1327 Flew Edinburgh to Brussels. This airline's business model is essentially, "as long as it's cheap, they will buy it, no matter how badly we treat them". If you find a really cheap flight with Ryanair, go for it, but just beware that if you try to change anything their customer services will not be helpful in any way or polite. The gates they get are always on the edges of the airport and they do not give you water on the plane if you ask for it. You have to buy bottled water. Every other airline I have flown gives you a cup of water. You will be charged for anything extra and it isn't cheap for the extra stuff (which includes suitcases). If you need to take suitcases, just take easyjet or another not budget airline. It might end up only being slightly more expensive and you will actually get treated well.
## 1328 Flew Birmingham to Dublin with Ryanair, have never been on one of these flights that hasn't been at least 90% full, this time around 50% as extra flights had been laid on for Cheltenham and this was one of the flights going back to Dublin near empty which made for a very relaxing experience. I fly this route several times a month and usually default to Aer Lingus as they can be cheaper if planned and booked in advance. This time fares on both airlines were exorbitant thanks to St Patrick's Day and the Cheltenham Festival and Ryanair came out cheaper. Brand new 737 with new interior and the very pleasant staff resplendent in their new uniforms. After a very stressful journey to the airport it was lovely to be greeted by such friendly staff, relaxing interior, comfortable seat (I had paid for exit seat for extra leg room so can't comment on the regular seats) and lovely relaxing music. It all felt surreal because our go-to response to anything Ryanair has usually always been negative but this looks like it's set to change. A few years ago, when I had taken my first Ryanair flight in many years I actually laughed at the state of the garish interior but not any more. Why ever did Ryanair not make these changes years ago, I imagine they are going to elicit quite the competitive response from competitors and not just from the no-frills market either. One comment I would always have to make about Ryanair is that although they can be categorised as 'no frills', the same can't be said about being a 'low fares' airline as some of the fares, particularly on this busy route can sometimes resemble long-haul fares. Apart from that, well done Ryanair and please keep up the relaxing music on boarding and disembarkation which is a really nice touch.
## 1329 Prague to Stansted. Since the change of the baggage policy it's actually been great to travel with this airline. Onboard meals and drinks are an ok price and the meals are warm and. Boarding was not a problem. The only slight negative is that it's a considerable walk to the gate because they have their own wing of the airport so be sure to plan time for this. Onboard entertainment would have been nice considering this was a 2-hour flight but I can live without it.
## 1330 Faultless for the EUR34 paid for a return day trip to London. Smooth security clearance and boarding at Bratislava in the early morning, on-time departure and early arrival. Enjoyed a decent coffee for EUR3. Comfortable it is not, but bearable for 2 hours, yes. Return flight boarded, departed and landed early. A couple of rows free at the back of the aircraft and managed to stretch out. I sense their "Always getting better" programme results are filtering down and no longer have the same fear/dread about flying Ryanair. Very good value for money and even looking forward to next flight.
## 1331 Nuremberg to London Stansted. Watch out for "I'll bring your change later" scam. This is the second time recently that a Ryanair steward has claimed not to have any change when selling me food and/or drink. He promised to bring it once he got some change, and I reminded him a few times, but still he didn't. The first time this happened to me, I was obliged to let it go. The second time, yesterday, I went and found my steward just before we started landing and asked him to go now and get me my change. He blushed, and did so. It wasn't much, one euro, but each euro pocketed is a euro stolen - from Ryanair, from me the passenger - oh and a percentage from the taxman too. But right in front of your seat there is a notice, saying that every sale will be accompanied by a receipt. I didn't get one - or think to ask for it. That's how they get away with it. Always demand your receipt on RyanAir, even if it's only for a couple of quid.
## 1332 Lisbon to Hamburg. First time using Ryanair and everything went smooth. However the seats were quite old, as the aircraft indeed seem to be too. The legroom is reasonable but not enough to be comfortable. The crew was friendly. It left and arrived on time. The price was pretty cheap too. I don't like the fact that it is only possible to check in online one week prior to departure and that it doesn't exist the traditional bag in the back of the seat in front of you.
## 1333 This was my second time with Ryanair and I was positively surprised. First flight on time, no problems, aircraft clean and very basic but good service. Crew were friendly. Return flight was delayed because of a mechanical issue but we were boarding the plane just 45 minutes later. We arrived 20 minutes delayed in Barcelona. Again good service, clean aircraft and friendly crew. Ryanair are getting better.
## 1334 Ryanair from Cologne to Warsaw. We departed and arrived early which was great. The seats weren't particularly comfortable but you get what you pay for I suppose. I was glad that our flight was only 90 mins as even I found the leg room quite small (and I have very short legs). We had no problems stowing our luggage in the overhead lockers (which we had carefully measured to ensure it was the correct size after reading too many horror stories of people with oversize cabin baggage). The flight attendants were friendly. We hadn't realised we needed to have our boarding passes stamped by a visa check person at the Ryanair desk before security (it was on the ticket but we just hadn't read it). We were lucky that the staff at the gate kindly offered to do the visa check for us instead. Considering the cost of the flights I would consider flying with Ryanair again but only for very short trips.
## 1335 Generally I don't expect much from Ryanair. However, when travelling on a flight from Cork to Stansted London last week, I came across the most disinterested, rude and incompetent air hostess I've ever had the displeasure of witnessing. Not only did she not greet anyone, she was rolling her eyes throughout the safety demonstration she was performing - the only thing she was demonstrating was how bored she was! However, the cherry on top was that she broke a bag! She broke the handle off a bag when closing the over head bin, picked it up from the floor and shoved it back in beside the bag as if nothing had happened! I was outraged and I wasn't the only one. So what is the procedure when a member of staff breaks a passengers suitcase? Hide the evidence and hope nobody notices? The only brief moment this woman cracked a smile was when everyone was getting off the plane and she was glad to see the back of them. So unprofessional, to say the least!
## 1336 MAD to Palermo with Ryanair. Seasonal summer flight. Many people bought priority boarding service making priority boarding as crowded as normal boarding. Plane was delayed for 30 minutes, but somehow arrived only 15 minutes late. Baggage was delivered fast. No complaint on this low-cost carrier.
## 1337 I started avoiding Ryanair scared of the way they used to behave with passengers but I increased the number of flights and it is worth it regarding cost and time. Last friday our flight was diverted to Bilbao because of the weather, and Ryanair set up buses to Santander and sent an email apology for the route change. I will continue flying with Ryanair if things keep at least at this level.
## 1338 Flew Ryanair from East Midlands to Dublin. For \302\24325 for a day return and both flights early I am not sure if there is anything negative to say. The plane was clean, it was cramped but only took 45 minutes. Both flights were smooth. Enjoyed seeing a friend in Dublin, did some shopping all made possibly by budget carrier. For paying next to nothing and having both flights early I thought it was very good.
## 1339 Tried to check in online for flight from Brussels to Barcelona but it kept trying to charge for seat assignments, we feel these add on charges after purchasing tickets is a "bait and switch" tactic to sell tickets. Therefore we decided to check in at the airport. The clerk at Ryanair was not helpful and told us we had to check in at another counter managed by SwissAir. We were there almost 2 hours ahead so when we went to check in we were told that there is an extra fee for checking in within two hours of flight. \342\202\25445 per person. We were shocked that there was this sort of fee enough so that we will never use Ryanair again. The service was mediocre on the flight, the seats had little leg room (good thing we are not large people). Luckily the flight was short.
## 1340 Several leisure flights in last year from two Italian airports (Venice Treviso and Trieste). After several bad experiences with Alitalia switched to Ryanair. All flights on time (most of them with early arrivals) and great airport service, especially in Treviso. With the new approach, much more passenger friendly attitude when it comes to the cabin luggage and assigned seats they really made a huge change. A bit worried before the last flight from Treviso to Tenerife South due to 4+ hour duration of the flight, however also this flight better than with traditional carriers. On time, both cabin crews extremely nice, even the seating not bad, mostly due to non-reclining seats. Good job.
## 1341 Luton to Lanzarote. We travelled as a family 2 adults and 2 children, our 10yr old child is a wheelchair user and has to have special assistance. This includes taking his wheelchair onboard via an ambulift and lifted into his seat and clearance for a weeks worth of liquid medical feed to be brought on board as well as clearance for a lithium battery charged feeding pump. He also has a specialist chair to sit in the aircraft seat and has to have a luggage waiver letter due to the feed. We were dreading the flight and of all the thing that could go wrong as something always does and has with other airlines. I was particularly worried as this is the first time we have flown with our son on a budget airline. I cannot praise them highly enough, their special assistance staff were great and everything was in place and nothing at all went wrong for the first time ever. Well done Ryanair, so pleased we are flying with you again in April.
## 1342 Dublin to Leeds early morning Ryanair flight delayed due to the plane needing to be de-iced in Leeds before flying to Dublin. Apart from this unavoidable delay everything else was fine with the flight which was full and managed efficiently by the crew. Great value.
## 1343 My wife and I flew Ryanair from Athens to Santorini in a Boeing 737-800. The flight was full for this 30 minute hop. Left and arrived on time. We only had hand luggage and made no purchases. Having not used Ryanair for many years this was our fifth flight in the last 6 months. Having no recline on the seats and allocated seating has made for a more enjoyable journey.
## 1344 Worst possible flight for not so "cheap" price Since we needed a Visa to travel to Spain their mobile app to check-in online did not work for us. So from Edinburgh to Barcelona I printed my boarding pass and asked them what should we do on our way back since the app did not work and we may not have access to a printer on our way back, They said since the app did not work for us it would be ok and they will print a boarding pass for us free of charge at Barcelona. Of course they didn't and charged us 30 euros for a piece of paper. They don't have a decent customer service even for payment and we had to stay in a long queue for nearly an hour. They claim to be cheap but I don't consider \302\243300 per person for 1:30 hrs flight "cheap". Anyways I will avoid them if I can.
## 1345 Ryanair flight, FR2773, Fes Morocco to London Stansted. Very similar to the outbound, a no hassle flight experience. Fes airport is a mess but that's nothing to do with Ryanair. Excellent priority boarding, plenty of room for bags in the overhead and front row seats. Departed slightly early from Fes but arrived half an hour early into Stsnsted. Flight crew very good and attentive. Seats OK for the roughly three hour flight front row are narrow though because of the trays in the arm rest but that offset by the monumental leg room available in 1A. Superb experience.
## 1346 Ryanair flight FR2772, London Stansted to Fes Morocco. Priority boarding worked, first on first off. Aircraft was clean and tidy, crew efficient. Had front row seat so acres of leg room, OK so it's not the widest of seats and the tray table is in the arm rest but it's fine enough for a three hour flight and I'm 6' plus tall too. Aircraft departed on time from Stansted and arrived early into Fes. What more do you really need to make it a good experience.
## 1347 We travelled from Billund to Palma de Mallorca with Ryanair as they were the cheapest at the time. Plane was on time, arrived before estimated arrival, baggage was a bit late in Palma, but I don't think the airline has anything to do with that. Seats were good, but couldn't recline. Legroom was mediocre at best. Staff was nice and helpful. The food onboard were really fat and of poor quality. Excellent value for money.
## 1348 A month before departure of our Ryanair Brussels to Alicante flights we wanted to remove 2 bagages from the reservation (2 bikes, 120\342\202\254 each). Simply not possible. When Ryanair were asked for a reason, their customer service replied: 'that does not matter'. Cancelling flights is also not an option: loss of all money. See attachment for this chat with Ryanair customer service
## 1349 East Midlands to Malaga with Ryanair. Boarded aircraft on time. Then told due to high winds we were unable to take off. This was not a problem as there is nothing you can do about the weather. About 2 hours later we were still on the aircraft - told they will contact Ryanair and get back to us in 20 minutes - this became an hour later. Told we would be disembarking and hopefully depart later when the wind had died down. A further hour later we were still waiting for ground crew to take us into the terminal building - not enough staff on duty. Finally told ok to take off so we departed after 4 hours sitting on the aircraft. After 2 or 3 hours (depending upon miles of flight) one is entitled to refreshments, phone calls and emails. This is obviously not able to happen on board the aircraft, so Ryanair leave you there so they do not have to pay out for anything. After this delay everyone was obviously hungry, so Ryanair made a fortune on inflight food and beverage sales.
## 1350 I flew Ryanair from Manchester to Dublin return. We pre booked seats and checked in online and no issues. We only took hand luggage and made sure we got to the gate early and my hand luggage wasn't taken. I am quite a nervous flyer and having never travelled with Ryanair before. From the start they looked after us and on return to Manchester we flew through the storm and had a lot of turbulence and a very bumpy landing - the crew constantly made sure we were all ok. I would definitely fly with Ryanair again.
## 1351 We prepaid for 20 kg of baggage as well as seat selection. The check in process in Marrakech was pretty straightforward and quick. We did have to walk on the tarmac both in Marrakech and Sevilla. Flight attendants were courteous and smiled. Granted there are no inflight entertainment or free food, nor inflight magazines. But the flight arrived on time with no fan fare. And there was plenty of legroom for us. They offered a charity scratch card raffle ticket for 2 euros. For a short 1 hour flight, Ryanair fit the bill.
## 1352 Ryanair flight was on-time and arrived slightly early into Lanzarote from Leeds. Cabin crew were just downright miserable and didn't look to be enjoying their jobs. All were foreign and very difficult to understand, same for the flight crew. I wouldn't like to think what they would have been like if we were depending on them in the case of an on-board emergency. Seats were a bit uncomfortable for a 4.5 hour flight but, that's acceptable for the low price we paid. Priority boarding is well worth the extra if you are taking a hand-luggage size suitcase on board to make sure that there is space available in the overhead lockers.
## 1353 Ryanair flight on time and arrived early into Leeds from Lanzarote. Compared to the miserable cabin crew that we had on the outward journey, the crew on this flight were fantastic. They worked very hard to provide excellent customer service and were very friendly and helpful. The captain gave lots of information several time throughout the flight and although we encountered lots of turbulence and a bumpy approach in a snowstorm into Leeds, I felt confident that we were in good hands. Excellent value for money flight.
## 1354 Booked on a direct flight from Alicante to Edinburgh on Tuesday 26th January. We received a very short text from Ryanair on the Monday evening to inform us that our flight had been cancelled due to an air traffic control strike in France and a link to rebook our flight. We didn't know what to do at that point. We tried to call their customer service team but could not get an answer - later discovered they all go home at 6pm, because all problems go away at 6pm clearly. We eventually got hold of someone the following morning who told us that they would put us on the next flight to Edinburgh - 6 days later. Having small children at home and a job to go to this was not acceptable. Neither was their insistence that they would not pay for our extra accommodation costs as 'it wasn't their fault'. We discovered that Ryanair were the only airline that cancelled flights due the strike - everyone else just diverted. When we questioned them on this they could not give us any answer. After much discussion, they finally agreed to transfer our booking to a flight from Alicante to Dublin on Thursday (2 days) later however we would then not be able to get a connecting flight to Edinburgh until the Friday morning. On asking if they would put us up for the night in Dublin we were told no, we could keep our receipts and claim back but nothing was gauranteed - as again 'it wasn't their fault'. To add insult to injury, the flight from Dublin to Edinburgh was delayed. We had to pay out for 2 nights accommodation in Spain, a night in Dublin, meals, extra car parking at Edinburgh. Never will I fly with Ryanair again, their attitude towards their customers is disgraceful. My only positive comment - the cabin crew on the flight to Alicante to Dublin were very friendly and cheerful.
## 1355 First time flyer with Ryanair and must say, very impressed on flight from Birmingham to Dublin. Perfect for short haul flights, no problems at all with check in, boarding, no delays going out but coming back very short delay but Pilot still got us back within scheduled time. Cabin crew were friendly both journeys. Flight was smooth considering bad weather conditions and for a nervous flyer made my flight more enjoyable. Would fly with Ryanair again for sure.
## 1356 Flew from Manchester to Rome Ciampino and back from the 25th-28th of January. I have flown with Ryanair a few times now and for the significantly low fares I have never had a problem with them. Flight from Manchester was full, boarding was fast and everything was smooth and efficient, flight arrived on time at Rome Ciampino. The return flight was a bit chaotic, the gate was like a bunch of farm animals and boarding was extremely chaotic and hectic. The flight departed over 30 minutes late and landed 15 minutes behind schedule at Manchester. Seats are really tight, I'm 6ft and my knees are pretty much touching the back of the seat in front of me. Cabin crew on both flights were very friendly and helpful. With Ryanair I have found that as long as you stick to their rules everything is a piece of cake. Would definitely fly with them again considering their low fares.
## 1357 Ryanair is a low cost airline so you need to be very careful with the booking and check-in arrangements. Any deviation will cost you almost as much as the ticket. The flight from Amsterdam to Dublin was full so some people had a little difficulty with their cabin baggage. If you have cabin baggage make it as light as possible or pay the extra to put it in the hold. If you insist make sure you get to the gate early. Ryanair have taken some slots in terminal H at Amsterdam. It is a new section of the airport and everything worked very well.
## 1358 I know that Ryanair is an economy "no frills" airline but for goodness sake there are limits. Flew from Luton to Valletta. They tell you that you can take a bag into the cabin and then spend the next hour or so harassing you at every opportunity and asking you if you would like to check in that bag for free. The seats are bolt upright and cannot be moved, the pockets on the seat in front of you have vanished and there is approximately 4 inches between your knees and the seat in front (for a person with average length legs anyway). If you sit next to the window you end up freezing cold and getting wet as ice forms on the inside of the cabin wall and when you point it out on the way off the plane the pilot explains that it's because their air conditioning system is so efficient that it ices up. The call to go to the boarding desk is far too early which results in at over 150 people standing strung out across the boarding gates for three quarters of an hour whilst the staff checking you through to the plane know full well that the plane hasn't even landed, and of course they are happily chatting away in their seats behind the desk so they don't care. This is just cruel and unfair, especially to those people who find standing around quite difficult. The staff on board the aircraft were more interested in gossiping and playing around than paying attention to the passengers. They know that most people won't buy anything because Ryanair rip you off so they are totally disinterested in what they are doing. One of the staff doing the announcements did so in such heavily accented English that it was almost impossible to understand what she was saying. I thought Easyjet was bad but even they are better than Ryanair and that takes some doing. I will never fly with this company again.
## 1359 On time flight with Ryanair from Dublin to London Gatwick. Friendly crew, all very efficient. Landed early. No frills, no nonsense. Staff helped elderly passengers by carrying their luggage to and from plane and also with getting the cases into the overhead bins. Completely confused as to people posting here about being affronted by the printing off own boarding pass requirement - its an online service and you agree to do so on purchasing the ticket. Can't you read? Ryanair dont give water - shock horror.
## 1360 Have not flown with Ryanair for a while and was pleasantly surprised at how bearable the journey from Birmingham to Tenerife South was. Fly by their rules and its not bad: check-in online; arrive in good time; respect the size and weight restrictions on hand luggage; expect to pay over the odds for refreshments (all sugar and carbs). Cabin crew friendly and efficient. We paid for extra leg room seats in row 1, but for most of the journey people queueing for the lavatory occupied some of the space to stretch out into. Seats not comfortable for a four hour flight as no support for lower back, and width restricted by solid armrests containing meal tray, but just alright all the same. Would fly with Ryanair again in the basis of this flight, and a very good price too.
## 1361 Booked with Ryanair from Barcelona to Venice Treviso due to an amazing low cost deal. We had no problem with check-in. The airline made it clear we had to check in online so we did at the hotel all fine. The boarding pass had clear instructions and we followed them. On flight the staff were great and even babysitted our baby! I didn't quite have enough money to buy by lunch so they let me off the full cost - thank you. We arrived on time. It was interesting that they offer scratchies etc - we didn't win! I will use Ryanair again and grab a bargain. You really need to just check-in online and ensure you bags are without the parameters to make it easy for all.
## 1362 Copenhagen to Dublin with Ryanair, and not too bad to be honest. There's a lot of product placement/advertising on the flight, but in this day and age it's everywhere - although it's slightly more apparent with Ryanair. Planes seem good, staff were helpful and kind (especially to me, as I am uncomfortable during take-off, so they try to accommodate my needs). I've heard stories about the harsh fees Ryanair charge, but if you do everything right you won't have this issue. Compared to other airlines operating the same route (Aer Lingus/Norwegian) Ryanair are 30% of the cost for returns - great value for money.
## 1363 Ryanair shows a total contempt for their customers. My partner and I arrived at the airport for our flight from Rome to Barcelona only to discover that with Ryanair you are required to check-in online or be charged at 45 euro fee per passenger! This wouldn\342\200\231t have been an issue if it were clearly stated in the confirmation email they sent when we booked, however it was only make clear in an email sent to us shortly before the flight. As we were travelling we had limited email access (which I feel is far from unusual when people are travelling). This is a pretty cynical way of extorting extra fees from their customers, as they know that a certain percentage of people will not receive the eleventh hour email and be forced to pay the fee or be stranded. We were arrived an hour and a half before our flight and they still wanted 45 euros to print two pieces of paper! The planes were unclean, staff rude, and the service horrible.
## 1364 Jerez to Barcelona with Ryanair. I would ride bareback on a donkey across a burning desert before I'd ever fly this airline again. You have to print out your boarding pass before you arrive (which is really easy for someone traveling) or they charge you \342\202\25450, they walk back in forth in the aisles with perfume for sale and won't even give you water on a two-hour flight. They are the worst!
## 1365 Back in December, I bought a 2 way ticket from Ryanair (60euros) for the 15 January for a friend to visit me - this week my friend informed me that from personal motives she couldn't come and see me, so I invited my Dad to use the ticket since it was paid. When I contacted the customer services, they informed me that they have a standard price of 110euros/pound to change the name, so almost the double of the price of the ticket price. This was definitely my first and last time I go though Ryanair to fly. No point saying that the ticket that I bought will not be used and it was money literally to the bin.
## 1366 I have travelled quite a few times with Ryanair and never had a problem. I went to check in online for my recent flight and realized that whilst in the UK I would be getting a new passport, so the details would be different for my return flight to Las Palmas. I used the new help chatline on the webpage, explained my dilemma, the staff checked my booking and in less than a minute had seperated my booking into two - allowing me to fly to Manchester using the details of my old passport, and as soon as I obtained my new passport checking in for my return. Very quick and very helpful.
## 1367 Manchester to Faro, and a very disappointing experience. I booked in July for a holiday to Faro in December, party of 4, of which 3 are disabled, 2 of which needed to use the abulift to access the aircraft. I booked special assistance at the time of booking and was allocated specific seats for out party to be able to access easily. We all booked in and went to special assistance area. All fine and good! Well apart from the huge queue that most people with limited diablilities could never stand in to go to bag drop. Flight called, we were taken to board the plane. Wait theres a massive problem, theres 6 people who have disabilities and need the abulift, but we were told Ryanair would only take 4! It seemed 2 others hadn't pre booked assistance but were allocated to board on the abulift. 2 of us in wheelchairs in my party were left on the tarmac whilst the special assistance and Ryanair argued about the fact the pilot wouldn't take more than 4! We got as far as the tarmac, sat for 10 minutes in the freezing cold wind whilst they tried to say we couldnt board. We were totally humiliated asked if we really needed to use the abulift and asked to prove wed booked special assistance, thankfully I always keep the paperwork safe. No other disabled passengers who were elderly were asked. It seems if you are young you can be challenged whether or not you actually need the help. Ryanair staff would not help and it took one of the special assistance staff to say how ridiculous and bad the situation was, for us to actually get on the plane. We were told shortly before we may not be able to fly as its Ryanair policy that they only take 4 disabled people who cant climb the aircraft stairs. Maybe when Ryanair take your money they should let you know this. 4 people on a whole flight is beyond ridiculous, it does not take into consideration that most people with mobility problems or chronic illness would find it very difficult to climb steps and carry a hand luggage bag, forget those who are confined to a chair. As a result I'd never fly with them again. I was made to feel like a nuisance.
## 1368 Ryanair nickel and dime you to death. Pay to check in, pay to change anything. Website to check in online won't load on my device. App crashes constantly. Couldn't check in online or two hours before, so pay \342\202\25445 to check in at the desk. Couldn't print, so \342\202\25415 to reprint ticket. Check in staff on the ground treat you like dirt. The seats are paper thin and don't recline. Every bag you check you pay through the nose for.
## 1369 Ryanair from Luton to Lanzarote. We were just about to touch down at Lanzarote on Boxing Day when we took off again. The captain announced 10 minutes later that we were going to land at Fuerteventura with a vague explanation about weather being a bit hazy. When we landed we were told that we'd be refuelling and taking off in 30-40 mins. After 1 hr 55 mins we were told to get off the plane to get food and drink. We were then dumped at the baggage carousel. Didn't even go through passport control and the next thing our bag were coming off. No one knew what was going on. We had to leave the airport and go to the Ryanair counter. Eventually we we told that we'd be getting coaches to the ferry port and then take the ferry back to Lanzarote then another coach back to the airport. We reached our hotel at 10:10 pm when we should have got there at 3:10 pm.
## 1370 I\342\200\231ve flown Ryanair many times. And given the rock-bottom fares, I can\342\200\231t complain. I'm amazed you can fly for those low prices! I\342\200\231m thankful Ryanair introduced the Business Plus fare which gives you priority boarding, 20kg of luggage and fast-track through airport security. Makes the experience a little more hassle free. I wish they would give you options for more legroom though. But given this 60 minute flight from Madrid to Tangier, I was able to keep my composure.
## 1371 Birmingham to Lanzarote, and first and last time to use Ryanair. My husband is wheelchair bound and father has difficulty walking, we were told to get to the gate 30 mins before other passengers, only to then be told we have to go on the plane last. So we had to wait until everyone was on the plane, then my husband was pushed from the back to aisle 6 in an onboard wheelchair, with everyone in the way and also most of them staring at him. Monarch Airlines always board wheelchair passengers first - this was absolutely disgusting.
## 1372 Ryanair from Manchester to Malaga return and delays out and returning. Very cramped, badly stocked trolley both ways at extortionate prices. Worst landing I have ever experienced out and back. Landed with such a bang that I surprised the plane undercarriage survived it! Never again.
## 1373 Day return with Ryanair from Brussels Charleroi to Manchester for just under \342\202\254300. Non-Schengen waiting area at Charleroi overcrowded and unpleasant, this part of the terminal is just too small. Outbound flight delayed by 45 minutes due to engine problem, but we were kept informed by the flight deck (boarding had already been completed when the problem arose). Otherwise uneventful flights. Hand luggage only, no checks for size were made at either airport. Good value.
## 1374 Weeze to Rhodes. Experienced one of the positive changes in Ryanair service. I made a mistake in the dates of the flights I've just booked. Due to the new rule that minor mistakes can be corrected without charges within 24 hours, I was able to put it right for free. At first the website didn't work correctly, but via the online chat-function everything was taken care off.
## 1375 Copenhagen to Kaunas on 23rd of December 2015. The low-cost price of my return Ryanair ticket was \342\202\254 310. Not exactly what I would call cheap for a 1 hour 10 minute flight. Safety and security instructions were given on a low volume PA system so that few people could barely hear it. Onboard, the seat was filthy from last passengers' food waste, the carpet was filthy with chewing gum, food and chips, and even the shabby looking steward didn't bother to put his shirt inside his trousers. Also, it looked as if his shirt apparently hadn't been ironed for a few weeks. Ordered a drink and a sandwich, was prompted to pay \342\202\25417. After having done the maths for the stewardess, the price was suddenly \342\202\25410. Ryanair has some kind of lottery sale onboard their flights. I don't know what this is all about, but it seemed a lot more interesting for cabin staff than the safety instructions. Upon landing in Kaunas I asked a steward what the local time was, but he had no idea that the time zone was one hour ahead of the departure airport. This is a filthy airline, and staff couldn't care less. Some claim that low-cost is the future of flying. However, I have absolutely no trust in this joke of an airline.
## 1376 We were stuck on the tarmac for over 2 hours after boarding because according to them, they had problems with air traffic control over France. I've never had this problem before, even flying with Ryanair before which was okay because I had extra legroom. This time I didn't get any extra legroom and the time on the ground was another 2 hours of torture on top of the four it took to get to Tenerife. Because the seats are so close together. Let's just say it was painful on my legs. I'm flying back to Birmingham on Ryanair as well in a couple of days. This time I managed to get extra legroom. You better not disappoint now Ryanair!
## 1377 The problem with Ryanair is that they seem to have the price table in Pounds and Euros, but it costs the same amount units, for example, I wanted to add a bag to my trip, it costs 25 inbound and 15 outbound, that's \302\24340 or 40 euros depending in where you live. Now I do not know any other company that does this! 40 Euros is \302\24329! So why I am being asked to pay \302\24311 extra than the chap from Euro zone? On top of that there is 5eur/GPB charge for adding a bag after you have booked the ticket (not sure what this covers as this is simply to add to my eTicket that I have also booked a bag). So that's another 10\302\243, so in total I have to pay \302\24350 when a chap from euro zone pays \302\24336(50 Euros) on the same flight! I'll be honest if I had a choice I would never fly with this airline, unfortunately I don't as they are the only airline that fly to my destination direct.
## 1378 Since Ryanair gave up making you feel like any error will be severely punished, I also noticed the hand luggage verification is less strict than it was once, and I am starting to enjoy travelling with them a lot more. This is good as one of their main European hubs (Orio al Serio) is 5km from my house and from there I can fly everywhere in Europe. I flew to Zaragoza for a short business trip two days ago and everything went very smoothly: on-time departures, clean aircraft, friendly and polite crew. The price was EUR 120 return but I booked just 9 days before so it is still a good price considering this destination is very difficult to be reached via Madrid or Barcelona and a direct flight from my hometown is a huge plus. I think their website did improve a lot too, less tricky than before and much easier to use. If they keep improving this way, they will likely see me more often onboard.
## 1379 Return trip with Ryanair from Dublin to Malaga. Dublin airport T1 busy but all security desks open, so all checks took about 15 minutes. Heavy rain in Dublin so flight delayed by 50 minutes due to air traffic restrictions. Plenty of information from the flight deck so all aware of ongoing situation. All aspects of the flight thereafter went smoothly, crew were professional and efficient. Able to change to exit seats once airborne. Return flight went very smoothly. Crew again friendly and professional. Although seating is tight, acceptable for a 2.40hr flight. Just love that seats don't recline and impact on your space. This flight on time. Like the new friendlier Ryanair. Happy days for 61 euro return.
## 1380 The most annoying airline and it is cheap for a reason. I wanted to check in but I couldn't check in for the flight back because it is more than 7 days away. They insisted that I pay for the seat with a minimum of \302\24311. Kiosk check in will cost me \302\24345. Just unbelievable!
## 1381 Bologna to Madrid in March 2015. The service was pretty good, there wasn't much queue for boarding / deboarding at the airports. There wasn't so much legroom in the seats, but I asked the crew to sit on the seats that are near at the emergency exit, where there was more legroom and they said yes. The food and drinks aren't free at all, a glass of water or a cup of coffee costs about 3 euros, but if you consider that the flight costed something like 30 euros that was acceptable.
## 1382 Horrendous experience, flying with Ryanair is basically what I imagine hell might be like and if I never have to fly with them again it will be too soon. Cramped seats, tacky promotions and they try to sell you all manner of things from food to watches and toys. The back of the seats reminded me of a McDonalds menu with the tacky yellow plastic. Our flight was also delayed due to technical faults and we were told we could leave the gates and the next information would be made available in 20mins. No further information was given so we returned to the gate anyway and were ushered through by two staff drinking pints of beer. Simply unbelievable and incredibly unprofessional.
## 1383 I have flown frequently with Ryanair this year, usually on this route. It has never been late, and although boarding can be a bit cattle like, it's quick and efficient. The cabin crew are hardworking and get on with their job. Both airports function well and after big terminals it's pleasant to get through them easily.
## 1384 One day round trip AMS-DUB-AMS. I flew second time with this carrier. Online check in was perfect. They have an app, so no need to print out my boarding pass again. Just have the barcode on my phone scanned to board the plane. One hour delay on outbound flight but on time on the inbound. Cheap \342\202\25430 round trip. Very basic service. Nothing fancy, but if they can offer tickets as low as \342\202\2542 per trip, I don't complain. Great way to spend the day, flying abroad for less money.
## 1385 Flew Edinburgh to Brussels with Ryanair. Airline travel at it's most basic. Cheap and effective but not particularly enjoyable. Cost cutting too far? I'd happily pay an extra fiver for my flight to have a seat pocket where I can put stuff for the flight without having to balance everything on my lap. A particularly big problem if in emergency exit row as you can't have bags near you. Next bugbear is seat comfort. OK just about for a two hour flight but more like on a local bus or commuter train. Sit on rather than in them. Otherwise early both ways, pilot kept us well informed. But need somewhere to store magazines, water bottles etc on a flight.
## 1386 I am a frequent flyer of Ryanair. I am aware of the charges that they have, which I have always honored whenever I have had to make any changes. Today I made a change online on a booking which my family had initially booked and paid for, but in error I changed the name on the wrong flight. I immediately contacted Customer Service via their online chat service, to help me with this mistake. I asked them to change my name to another booking (Germany to Dublin) since a few minutes before I had already paid a fee of 110ers on a wrong booking/flight (Dublin to Malta). Unfortunately I was told that they could not make this change and I had to pay another 110ers again to make that change. It was a genuine mistake which was going to cost me another 110ers. It is ridiculous! It is a shockingly bad policy. Why do you have a customer service when you are not there to help the customer!
## 1387 The outbound Ryanair flight was fine and ran to schedule however the return flight was a different matter entirely. On 11th December the country was suffering some severe weather and Ryanair cancelled every inbound and outbound flight to Dublin. I appreciate that safely is of upmost importance but many other airlines were still operating with the majority of Air Lingus flights still flying in and out. There was no explanation why this was so. The next available free transfer to another Ryanair flight out of Dublin was 6 days later. We managed to book on an Air Lingus flight a day later. The refund from Ryanair was paid promptly but it would have been nice to receive information as to why there was a blanket cancellation of all of their flights on the day when other airlines were still operating.
## 1388 Horrible experience with Ryanair from Dublin to London Gatwick. Flights were cancelled while the planes sat at the gates, unable to take off because of weather (they said, other airlines were landing and departing). They emailed us to notify us of the cancellation - no staff to help at the gate. It was chaotic. The lines at Dublin airport were hours long and they encouraged us to leave the queue to book online. Their website, poorly designed by any standard, could not handle the traffic and we could do nothing. I finally ended up booking a flight on Aer Lingus just to get out of there. Although I had paid little for the ticket, the inconvenience was significant.
## 1389 One way daytime Ryanair flight from Birmingham to Lanzarote. Pushed off and landed on-time, if not a few minutes early. Fairly full plane but had a spare seat to stretch into, so more comfortable than the usual Ryanair seating. Cabin crew cheerful and pleasant. There can't be many people on this earth who don't know that budget airlines make their profit from quite pricey on-board food. I reckoned a good 80% of the passengers bought food and/or drinks on the plane, and seemed to be doing so from choice. So why complain that it is dear? Take food with you if you're that bothered.
## 1390 Ryanair flight from London to Barcelona was ok but seatbelt light was on for nearly the whole of the two hours and definitely the last hour. People kept trying to go to the toilet and were told to sit back down because the seatbelt light was on. There was no turbulance and no reason for the seatbelt sign to be on. I think they forgot to turn it off and made people sit in discomfort. Very annoyed because I was obviously one of those people. Our luggage also took 1.5hrs to come out which was annoying because I had to meet my B&B host at a certain time.
## 1391 Vilnius to Milan. Disappointing customer service today. Ryanair tries so hard to reestablish its image in the eyes of Internet. However, the attitude towards their customers is still miserable. I couldn't check-in on their website, neither could my friend the day before. We both had the same bug. I've contacted Ryanair through live chat and they said they don't have any bugs, and probably it's my problem. They advised me to use Mozilla instead of Safari and Chrome. The representative asked me if it was fixed and without waiting for my reply immediately added "Goodbye" and logged out. Situation 2 (with happy ending this time). Within 24 hours of my booking I decided to change the date of my flight. On live chat they've reassured me that it was changed. One day before my flight when I decided to check-in I found out that the date wasn't changed, and it caused a lot of stress. I was really lucky they still had some seats for a preferred date. Though this time they apologised and immediately changed the date, I appreciated that. On other note, the advantage is its low cost. However, most of times I prefer same-priced but more polite Wizzair.
## 1392 Stormy weather and cancelled flights because of a natural cause happen. And people were not mad at all, just tired and a bit confused. Everybody tried to solve the situation peacefully. But Ryanair simply doesn't care about anybody. Providing people with bottled water and blankets for the night wouldn't really cost much. Ryanair simply didn't give a damn. Rude announcements telling hundreds of people to pretty much go away was all we've got. Shame.
## 1393 Birmingham to Fuerteventura with Ryanair return. An airbridge was used both ends going to Fuerteventura. An airbridge was used in Fuerteventura for boarding coming back - but on landing back at Birmingham at 2245 had steps down to a very, very windy tarmac followed by many steps up to an airbridge not 20 yards away. Why put people to such inconvenience at that time of night?
## 1394 I've flown with Ryanair a few times. This flight from Warsaw to Madrid on had something unpleasantly memorable for me. I was sitting in the back (28 or 29) in an aisle seat. The flight attendant who was in charge of the back was a man, a strong and big one. The space between Ryanair seats are tight and also the aisle is not a wide one. Thus it was very difficult for that flight attendant to move. I never forget how he (unintentionally) hit my head with his elbow when he was trying to move in the aisle serving drinks to passengers. To my surprise, he didn't even turn back to say sorry. He might not have realized that he ever hit me! To cut a long story short, Ryanair can change the space between seats in order to host more passengers as long as the passengers are informed beforehand (like their rules about printed boarding pass), but their employees ought to fit in their technical amendments and measurements!
## 1395 Copenhagen to Charleroi and Ryanair is not the best company for this route. Was late 30 min - the same three days before when arrived to Copenhagen. We stayed one hour standing and waiting to board after the control of the tickets. Without any explanation both times. So if you want to be late, you choose the best company for this route. The plane didn't have a table in front of the seat, very poor service. And also in the Copenhagen airport is at gate F almost every time, far from the entrance.
## 1396 Flew Lanzarote (Arrecife) to Manchester in November. Ground staff were outstanding, checked in our bag for free due to us forgetting to do it before hand. This left a very good impression. Cabin crew were friendly, they came though the cabin twice with the snack trolley. Seats were ok, a bit tight on leg room, but enough space to move your legs. Overall impressed with Ryanair, and very glad we tried them and we will surely consider then for my next flights.
## 1397 Away on time and arrived at East Midlands in very blustery conditions, pilots skillful landing drawing applause from a full aircraft. Didn't eat or drink onboard but cabin crew genial, bag stored on floor in front of me. Total cost \302\24330.98 return. Fantastic value, A to B travel, do what the booking form says and eat before you travel.
## 1398 You think it costs less to travel with them, but they have all sorts of hidden fees that will surface eventually. Just had a horrible incident flying from Berlin to Barcelona. They charged my friend and I, 45 euros each because we did not check in online. Not only the hidden fees, but also the rude attitude of their employees made this the first and the last time I'd ever consider traveling with them.
## 1399 Really very poor. Ryanair flight from Stansted to Lisbon was delayed by 20 minutes at first, then we were ushered onto the flight very rudely and told to speed up in order to meet departure time. Only 1 person to board the entire flight making it a slow process despite being rushed. They then missed the second departure time by 3 minutes due to slow boarding (not the fault of the passengers but the fact only one person was checking boarding passes) and we were then delayed a further hour and a half. Not even remotely worth the cheap prices. Unimpressed to say the least.
## 1400 First the positives of our flight with Ryanair - the fare was cheaper than a return train trip to London (as long as you do not check bags or purchase goods on board). The negatives (which mainly focus on Stansted). Absolutely useless ground staff, once the departure gate was eventually flashed up on screen we joined the heaving mass crushed onto the little shuttle to the gate for a mad dash (due to the short notice). Once we arrived at the lounge, we were met with total chaos due to zero management (none visible). Queues were criss crossing each other and people were getting most upset. I asked one of only two staff checking two different flights (no other staff were available) which queue was which, to which she replied, "I don't know it's all over the place back there". Once we got to our desk, the lady checking us did not make eye contact, she simply looked at the pass glanced at our passports and said go through, an opportunity for a security check missed. After walking across the cold wet runway we got to the plane to find out that the back door had only just been opened, so of course earlier boarders had had to use the front door, which of course meant utter chaos on board. Anyway a second security check was missed here as the girl checking our seat passes only looked at one. Come on Ryanair, you seriously need to sort out this appalling issue. Who is to blame? The airport or the carrier? I will not be using Ryanair again.
## 1401 Stansted to Gothenburg. Flight was on time, and aircraft was not full so had a row of three seats to myself. I only carried hand baggage and did not make any on board purchases. The flight cost \302\24310 plus \302\2435 to pre-book a seat you cannot ask for better value than that. Crew very good.
## 1402 Although we flew to Malaga with easyJet we returned with Ryanair as the flight time was more convenient and the cost was slightly less, especially as it was in euros, although I declined Ryanair's "kind" offer of their guaranteed exchange rate. (Even with the surcharge imposed for credit card use I paid less than via Ryanair's guaranteed rate). Apart from that possible catch in the booking process, everything else about our Ryanair experience was fine. Boarding was efficiently handled and even a difficulty with our boarding passes - the barcodes could not be read - caused no comment. The cabin crew did sterling work managing to stow everyone's cabin bags in overhead lockers, even telling passengers whose bags had to be located away from their seats where exactly their bags were to be found. There certainly seems to be a more customer-friendly approach from Ryanair these days and we are less apprehensive about being caught out in some minor, but expensive, infringement. Though it's still wise to read all the small print before flying, we are now quite ready to choose Ryanair if flight times and prices suit us. We still find their 'leather' seats less than comfortable after a couple of hours, however.
## 1403 We have flown Ryanair numerous times over the past 2 years and flights have been near enough the same. Only travelled with hand luggage so straight through security at Stansted. Flight gate displayed on screen about 40 minutes before departure and routine walked straight to the gate. Had book priority boarding and exit seats. Aircraft was clean, bought own food to eat but did buy drinks twice. About 3 drink sales through the 2.5 hour flight, and cabin crew very friendly and efficient. What more could you ask for especially as we paid only \302\24370 each return including priority and extra leg room. I would much rather pay less and fly Ryanair. Flight was punctual, as have en all previous flights with Ryanair.
## 1404 We were upset that when we booked in at Tenerife and had to pay 80 Euros extra for our luggage to come back. We thought it had been paid for when we booked our flights. Arrived in Tenerife on the Friday and realised we had not got boarding passes to come back. We were lucky enough that where we stayed had a very helpful young lady to do it for us. Altogether Ryanair caused us so much stress. We won't be flying with them again.
## 1405 I do not mind flying Ryanair as long as it is much cheaper than the competition. Choosing your seat is cheaper than choosing a seat with British Airways. Plane seats are acceptable for short haul flying, the cleanliness could improve. Cabin crew do not bother you, but quick to react if you want something to eat. I ordered a 5 euro lasagne which was adequate for the flight. I avoid their drinks as they are overpriced so bring my own water. What ruins the Ryanair experience the most is flying into Stansted Airport. What a joke of an airport, it is enough to make me avoid flying Ryanair unless they are at least 30 Euros per leg cheaper. Any less than that, and I avoid flying them mainly due to the disgrace that is Stansted Airport.
## 1406 Manchester to Beziers. First time flown with Ryanair since 1993. Crew both ways worked hard and everybody was served at least once throughout both flights. Flights comfortable and made better that seats did not recline. Check in at both airports was good. The only thing that spoilt two good flights were Ryanair's handling agents at Manchester on return, baggage took over an hour to get to carousel and our bags were off first.
## 1407 Flew Ryanair from Prestwick to Gran Canaria, paid \302\24325 for the flight, no problems at all. I don't understand why some people are still complaining about printing boarding passes, it quite clear when booking that you have to do it - why wait until getting to the airport and then moan. I don't have a home computer so I just go to my local library to print them, simple,
## 1408 Barcelona to Las Palmas with Ryanair. Two pax, aged 69/70, one with heart condition, one with mobility problems. Booked Business Plus BCN-LPA. This entitles us to airport (c.f. online) checkin, 1 checked bag each, priority boarding, best seats. Paid the premium to de-stress the trip. On arrival at airport denied all the paid for benefits except reserved seats, made to pay \342\202\254190 for checkin and bags, and forced to run length of the terminal with bags, through security (stuff confiscated) and check them at the gate. The ground staff were exceptionally rude and totally unhelpful. Apparently the computer contained no record of us paying the Business Plus premium, and showing them the voucher on my tablet computer had no effect.
## 1409 I am nearly 6ft tall and I don't have any problem with leg room. What I do love about Ryanair is that the seats don't recline, so you won't hvae your tray stuck in your face by someone in front of you reclining their seat right back. I think it is bad manners to recline a seat on these short flights.
## 1410 This was my third time flying with Ryanair and I have to say that I feel something changed there. Crew were much nicer than before (I flew with them a year ago). I didn't have any issues because I knew the protocol already. I could write that seats were terrible, but there's no point in doing that because it's a low cost flight and I was very happy with it. Can't believe it, but I'll give this a good rating. For the price I paid, I got more than enough.
## 1411 Ryanair have stepped up their game. Customer support has improved and cabin crew on the plane were kind and friendly. However, the cabin could get cleaned a bit more and some extra leg room would be nice. I didn't go to bag drop as I only had hand luggage. On my outbound and inbound flight, they were both 10 minutes early and we departed on-time both times. I would definitely fly Ryanair again.
## 1412 I booked with Ryanair in April 2015 and found myself that they had brought forward my flight in March 2016 by 7 hours. I never received a email confirming the change so I contacted them and they said the don't usually contact passengers until a month before as it is more than likely be changed again. So they are selling tickets to passengers knowing they most likely might not be flying at the times advertised - I got a full refund, but had I not checked the times I would have been left with shattered plans, beware.
## 1413 After travelling almost every holiday with SN Brussels Airlines, we decided to fly with Ryanair. Not because we're out of money, just because the flight schedules were better, we wanted to arrive early in Rome. So we went in the Boeing 737 and there wasn't much of leg space. The cabin crew was friendly. In the middle of the flight there was a kind of shop aboard and other commercial stuff. The ground service at Brussels Airport wasn't that good, it was very chaotic. But, if you compare that with the low fares, you can't complain much. I had a pleasant flight without any problems.
## 1414 Last night in Barcelona I met the most rude and ill mannered Ryanair employee. As an orderly queue of travellers were gathering we joined the ever increasing line, this staff member came along and blurted out to us towards the rear of the queue "your hand luggage must go in the hold" and started just in front of us to put yellow tags on. He was asked had he done the same to the front of the line and he replied no - just from here back, 38 bags, in the rudest way you could imagine. He explained "I have the right to do what I want". Come on Ryanair step up to it and stop your staff talking rubbish and being rude to the passengers. Other than that lovely staff onboard and perfect job on a very foggy night
## 1415 Extraordinary treatment of passengers by Ryanair. Departing from Stansted very early on Wednesday morning the weather was horrible and raining very hard. The aircraft was off jetty so had to be boarded by steps front and rear. 2 passengers were in wheel chairs and clearly unable to walk at any great speed let alone climb stairs. Boarding commenced with passengers having to walk quickly to the aircraft steps only to find at the rear that one of the elderly was making very slow progress up the stairs. A queue quickly formed as she progressed excruciatingly slowly with help from family members up the stairs. In the meantime, without any cover, passengers waiting to board became totally drenched. I got to my seat as with many others looking literally as if I had just stepped out of a shower fully clothed. Is it really beyond their wit to either have as high loader to facilitate wheelchair passengers onto an aircraft that is off jetty, or if this cannot be managed, hold back general boarding for just 5 minutes while all passengers needing assistance are able to board, thereby avoiding the angst and drenching!
## 1416 Tried Ryanair for the first time. Its ticket (once you added a checked bag and reserved seat) was actually more expensive than Aegean, however, it had a slightly better schedule. Check-in costs \342\202\25445 but online check-in with mobile app was free. OK, did this. Then informed I couldn't use electronic boarding card, so would have to pay \342\202\25415 at airport. After silliness with customer service, who sent me (very) fine print detail that does indeed say non-EU cannot use mobile app, then stopped talking with me. I finally went and found a hotel to print hard copy for me. Then, there was the mayhem boarding (agents ignored "priority boarding" (glad I didn't pay for that!). Once on board, we found space for our small bags and settled into the most uncomfortable seats, only to have flight "attendants" (cattle movers) start taking bags down so that those with larger bags could put them up. If you had a soft bag (even if large) they pulled it down to go on floor so that those with huge hard shell bags could put them up. Never seen that before.
## 1417 London to Athens with Ryanair. On this flight we had a 2 hour delay due to the fact that there was fuel spillage on the airplane so we had to deplane. Apart from this we made up a bit of time on the way back. All in all its good value for money and has new airplanes.
## 1418 We arrived at the boarding gate to see the chaotic Ryanair queue in which we waited for a long time and then Ryanair announced that the first 90 cabin bags were guaranteed on board. When we finally got to boarding the aircraft a member of staff told us we were the 90th passengers, therefore our bags would be put in the hold for free with no lock on. Fair enough. However, after boarding the aircraft we found that many people behind us were entering with bigger cabin bags which hadnt been put in the hold and that there was indeed space in the bin above our seat. This started to annoy me particularly as passengers who got on with their bags (I don't know why) with the assistance of their cabin crew came from all over the aircraft to put their bags and coats in our overhead locker whereas we had to sacrifice our personal items to be put in the hold. Luckily for Ryanair, the flight was uneventful and our bags arrived safely. Overall, if after ninety pieces of cabin baggage have boarded the plane, enforce the 'putting cabin bags in the hold' rule fairly and accurately.
## 1419 Used this new route (CIA-OTP) for a city-break in Rome. Decent price and convenient sheduled times. No problem to use Ryanair's new site and print the boarding passes. Both flights departed on time and landed ahead of shedule, ground staff was polite and efficient, and crews were attentive and professional. Clean planes with enough legroom, uneventful pleasant flights. I was happy to use Ciampino Airport instead Fiumicino to reach Rome city center. I hope Ryanair will increase their operations in Bucharest or even build a base there.
## 1420 I was a little surprised by the high cost of the "lower fares" Ryanair to fly one way from Pisa to London but didn't give it much thought. I made the supreme mistake of not checking in on ine prior to arriving at the airport. I was told that before I could receive the boarding passes it would cost another 45 euros each my wife and myself. It's mandatory. This, after I had paid for the tickets online with my visa card. Not having a choice, I coughed up the 90 euros so we could catch a connecting flight with an ethical airline company. I am a 71 yr old retired business man with many transactions under my belt but have never in my 50 years of business been the victim of extortion. Ryanair is no longer a "lower fares", honest, ethical or even decent airline with which to do business. If I should ever find myself in the position of having to fly to a place served only by Ryanair, I will either walk or not go there. If I could post this with less than one star, I would.
## 1421 Flew Ryanair for a business trip to Dublin. Chose Ryanair over airlines departing from Schiphol, because Eindhoven Airport is more convenient (small airport, with very fast check in/customs, boarding and luggage delivery - from landing to car in 20 mins). With Ryanair you know what to expect. Cramped seats and except for carry-on luggage, everything else will cost you. Value for money is good though, especially if you book in time and don't need to bring much luggage. Both flights were uneventful and arrived on time. The flight from Dublin to Eindhoven (Friday) was however boarded by a rather large group of semi-drunk Irish (wo)men who continued their drinking during the flight, had to use the toilets all the time and blocked the aisle. Headphones provided a welcome layer of isolation. For some reason, on the return flight there was more cabin luggage than could be fitted in the lockers. This was solved by putting whatever wouldn't fit on the floor of some free seats. Not sure if this is standard procedure, seemed a bit odd. Anyway, it was the standard Ryanair experience. If you don't mind the lack of comfort and service, it is perfectly fine for a couple of hours and good value for money.
## 1422 I think Ryanair is the easiest way to fly short haul in Europe. First of all it's a low cost so it's very cheap and very easy. But the problem is that because they're a low cost airline, they charge for everything, including food, luggage and a lot more.
## 1423 Bari to Trieste with a 9hr 32mins delay. Never again with Ryanair. We were on plane on time already and because of an technical problem we have to go off again. That's ok, but than started our all day waiting in an unorganized airport of Bari. Frst they tell us that the new flight time will be 5:25pm, but they have know already that won't be before 7:40pm.
## 1424 Rule changes at this airline have been definitely for the worse. At check-in if you do not pay extra for a seat selection you will be assigned the worst seat available. Some rows will remain completely empty but you will be asked to stay in your assigned seat and fly squeezed between two passengers. A second problem is that in order to be more customer friendly Ryanair now allows or does not care anymore if you take two or more pieces of luggage into the cabin. Some are huge and well over the size allowance. The result is either you board early or you will not find space for your small piece of luggage anymore. Boarding early does not help if you carry a soft bag as you will later see that the crew even help to squeeze hard suitcases into the overhead holds not caring about the content of your soft suitcase. On this fight I was shocked to see that about 15 very big suitcases were stored in empty rows placed in the free space between rows, the aircraft was about to take off when the chief assistant asked the assistants to remove the bags and place them elsewhere. Bags and suitcases were not put under the seats either, most of them were just put between seats.
## 1425 I was expecting this airline to be extremely terrible. I had seen reviews online and the planes themselves didn't look very nice. However, I was pleasantly surprised to find that we had a fairly decent flight. The first thing I noticed once I got to my seat was that it didn't have a pocket. I didn't mind but It was a bit bothersome to keep all of my trash in my pocket or on the tray table. There were mid-flight advretisements which I thought was strange (I'm used to flying nicer airlines). However, nothing during the flight bothered me. We arrived 20 minutes early in London and I would have to say that the flight wasn't bad. I would fly it again.
## 1426 Tried Ryanair biz plus as I normally go BA, not even a cup of tea. A bun fight in the queue to board and I had asked for disabled assistance both ends. In Dublin nobody to help even though pre-booked, on my return to Dublin complained and was assured there would be no problems at Stansted. On my return there was nobody to meet me, so they let me down twice. Will not use again!
## 1427 Staff associated with Edinburgh airport were fantastic, helping us to clear security quickly and with very good humour. In contrast, Ryanair staff were surly and officious. After a pretence at asking for volunteers to have cabin baggage put into the hold 'free of charge' the staff member decided to pick on the middle of a long line. We explained that the child travelling with us was unwell, having been taking Calpol through the day, and asked if she would not transfer our luggage to the hold, especially as our arrival would be late evening. Asked about how long the delay at baggage reclaim would take, the staff member became very officious and suggested we were arguing with her. We had not been asked to give her our boarding passes until she had become very defensive - "Are you going to give me your boarding passes?" - when we handed them over immediately. She was obviously having a bad day, and did not transfer anyone else's baggage to the hold after us. We were left to remove valuables and repack our bags. As someone who works in a customer-focused business, I find it hard to believe that staff can get away with rudeness and off-handed comments on a daily basis. I also note that the baggage label suggested that our baggage would not be covered by Article 4 of the Warsaw Convention. This was not pointed out to us. I will avoid Ryanair at all costs in the future.
## 1428 Ryanair flight from Stansted to Pisa was fin,e and crew were good. Boarding was a shambles as the gate had closed before anyone came to process the passengers. People were having their cabin bags taken into the hold at random even though the bags were well within the limit. One passenger sailed through with a backpack the size of small car and the staff said nothing. Makes me wonder why I bother following their rules.
## 1429 Ryanair may have super low price deal, but only if you're familiar with the rules. Make sure to online check in once they send you the mail a few days before the departure date. Otherwise you will be penalized for \302\24345 per person. If you don't print your boarding pass or have their app, there will be a penalty of \302\24315 per ticket. The check in process was pretty lengthy. You have to line up for check in first and then line up again to drop off the package. Make sure to be in airport at least 2.5 hrs earlier.
## 1430 I've just been on Ryanair's re-vamped website. It told me about 4 times that my session had timed out (after being on there only long enough to enter my booking number and email). When I started again from the beginning it told me that there was a problem with a script running on the webpage. Leaving it for some time and starting yet again, it told me that if I wanted to check in it would cost me \302\2435.99 and that free checkin would only be available 5 days prior to my flight. I had been going to book a seat and priority loading both ways. Now I'm not going to bother, so they've lost a sale that they could have had from me.
## 1431 Having received an e-ticket which stated: "Your trip is now fully confirmed" I arrived at 06.30 hrs and waited for nearly half an hour to book in. When I got to the front of the queue I was informed I would have to go elsewhere and pay \302\24345 because I had not got a Boarding Pass at least 2 hours before the flight left. I "very reluctantly" paid the \302\24345, which will be refunded by a Danish University. No other airline I have flown with has made this stipulation, and so having read the words "fully confirmed" I simply checked times and flight numbers.
## 1432 We were called to board on time, this morning, at 7:15am, for an 8am Ryanair departure. All seemed well. We had concerns after being delayed on the outbound flight from Edinburgh, 2 weeks earlier. After standing on a staircase for 10-15 minutes we were told to return to the departure lounge. The staff, not Ryanair, told us there was a problem with the plane and it may take at least an hour to resolve. We received no more updates and the notice boards simply said boarding and gate closed. At approx 9:15, the notice boards stated we had to board again, but from a different gate. The plane was fully boarded by 9:45am. The doors were closed at 10:02am, and we took off at 10:15am. This was a delay of 2 hours and 15 minutes. The captain said it was down to Spanish air traffic control, they told us it was French air traffic control that caused the outbound delay. As Ryanair's terms state that if you are delayed by at least 2 hours, you will receive a text stating your rights, explaining compensation etc. No text received. When I challenged the stewards they said they thought it was 3 hours, not 2! Wow they didn't even know their own rules. They weren't willing to help at all and said I should just complain directly to Ryanair. Which I will be doing. The staff were more interested in selling as many snacks and drinks as possible, rather than apologising for the delay and issuing passengers with a food and drinks voucher.
## 1433 Stansted to Memmingen return with Ryanair. Both flights almost full and on time. We haven't flown Ryanair for a few years and were pleasantly surprised. The lack of recline in the seats means your space is secure, no seat back in your face as soon as the wheels are up. We only had hand luggage and did not buy any refreshments.
## 1434 Initial Ryanair ticket seems to be cheap but you must pay for anything. If you have the bad luck like me to lose your boarding pass you must pay penalty to issue new one. Check-in staff are rude. Onboard seats are too close, you cannot move them front or back. Because the low fare ticket they do not serve anything for free, even water, you must pay for everything. Finally I had the feeling that I was traveling by a bus and not with a plane.
## 1435 Staff very pleasant and with no adjustment on seat found the it more comfy as minimised other passenger interference with me. Boarding on the home leg little chaotic due to the logics of no Ryanair ground staff. I read up on onboard limits and stuck to them, so no extras and because little hold luggage loaded, no hold ups that could not be made up in flight.
## 1436 Used Ryanair for many years, never a problem. This was a Bournemouth to Gerona return trip for under \302\243100 return for 2 people all in - that is good value. My only gripe is the new seat allocation, I much preferred 'free seating', but I know I'm in the minority. Out on time, arrived early and return flight on time. Great value, but you do need to read the terms and conditions carefully.
## 1437 Aircraft was clean, we set off within 15 minutes of scheduled time, staff were pleasant and friendly, and kind when I started to have a massive nosebleed! I had a nice cup of coffee on the flight and while it cost 50% more than I might have liked, it was good quality. The flight was not completely full so there were few issues with hand luggage and so on, and I like being able to take two bags with me as this saves a great deal of hassle. Downsides were due to Stansted's overcrowding. There is nowhere to sit while you wait for a flight, as they are rebuilding. The security is chaotic and unnecessarily stressful as they have not invested very intelligently in the screening equipment and they have rather bizarrely chosen hardware that increases rather than reduces processing time. Finally we were somewhat kettled in a holding bay near gate 88 by ground crew without explanation before boarding, while another flight disgorged its passengers, and I think it might have been better for Ryanair to send us down a bit later, as some of the families and older passengers grew uncomfortable with nowhere to sit. The Stansted experience is starting to put me off using EasyJet and Ryanair, and I often choose Heathrow and scheduled flights instead. In Ryanair's case, the cost difference between many of their tickets and a scheduled flight is now negligible and sometimes the scheduled flights are even cheaper and include more, so I wonder if Ryanair will be in business in a few years' time, despite their efforts to be less nasty to passengers.
## 1438 I paid \302\243300 for a return trip Manchester to Corfu, including 2x20kg bags. Aircraft quite new and seats adequate, although a bit thin. Cabin could do with a clean between flights. Received emails reminding me to print boarding cards. Crew are like any other airline, friendly and welcoming. Drinks and food a bit pricy but that expected.
## 1439 I had a negative experience with Ryanair. On arrival to the airport I was informed that I had not checked in online and there would be a 47 Euro charge to do so at that time. They claim they sent me an email alerting me to this request. I then discovered the request at the very bottom of a lengthy email which I needed my reading glasses to see. The email heading was that of a receipt for my flight, following which there were large, bright colored advertisements and after that offers to increase legroom, check in extra baggage etc. All of these were prominently displayed. The heading of the email had nothing to do with checking in online. I was refused boarding unless I paid the extra cash by the haughty person behind the desk - I simply left and took a cab back to Porto. This type of deceitful behavior on the part of Ryanair deserves special mention.
## 1440 Cheap airline with no frills flying. Flew Ryanair for the first and last time while in Europe. Had been warned prior but didn't think it would be a bad experience so opted for the 2 hour flight. Had paid for costs including additional baggage upgrades online, but was still asked by gate agents to pay for additional weight (despite internet agent telling me otherwise). Was rather upset with Ryanair. Overall, flight was mediocre and cabin rather dirty (food from prior flight still on floors). Agents not really attentive and overall more concerned with getting flight over with rather than helping customers. Seats were leather but thin and poorly cushioned. Stay away from this airline as the pricing is fool's gold.
## 1441 The flying experience was nice and much better than expected, this being my first Ryanair flight. Reason being I had booked a flight (bus flex) for my daughter and her friend (14 and 15 yrs). During the booking no "warning" was given and also while trying to checkin, which did not work, no mention of the fact that children under 16 are not allowed to fly without anyone above 16 in company. By chance parents of the friend found out under AGBs that our children are not allowed to fly on their own. With repetitive chat, call and email I am told - it is written in the AGBs! Ridiculous - if you would have children stuck in a foreign country without money and place to live you give a damn to AGBs which are almost always ignored anyway. I had to break my schedule, spend hundreds of Euros to just pick up the two experienced travellers vs many above 16 I know who cannot travel alone. If Ryanair wants to stick to this ridiculous rule, they ought to find a way to cleary and "loudly" inform during the booking. If I had not been able to pick them up, the expensive bus flex tickets would also go waste. All just because I did not see a need to read the AGBs!
## 1442 Aircraft clean and departure on time. Check in was ok, but ground staff not very customer service oriented. Cabin crew gave a friendly welcome when boarding. During flight no free foods/drinks, but for sale. After service was finished I noticed two of the cabin crew sitting on boxes in the galley playing games on mobile phones which is not very professional. I gave 5 star for seat comfort as I booked a seat in first row / emergency exit row with a lot of leg room.
## 1443 We haven't flown yet, the flight fr5995 from Madrid to Stansted due to go at 13.35 was first delayed 6 hours, and now due to go at 23.30 - its now 18.40. No info or updates, one measly food voucher that covers a sandwich and coffee. They could have let us all on a later flight and put those people on our later one, but that would have meant 2 plane loads of disgruntled travellers. Never again with Ryanair.
## 1444 Utterly stripped-down and basic flight as usual. Very restricted legroom. No hot drinks, not good for a 3.5 hour flight. And why allow huge hand luggage into the cabin then demand that people with smaller bags put them under their seat when there's hardly any legroom? Ryanair is flying at its least pleasurable.
## 1445 We flew Ryanair from Bristol to Limoges and returned the following week. This airline went out of their way to accommodate my disabled wife and her equipment.
## 1446 London to Dinard return. Only fly with them because convenient airport not far away from where I was going. Short flight of 55 minutes. But constant announcement, some crew with poor level of English including the one in charge. Very poor customer service. On landing on the second flight was seated toward the back and heard crew conversation that was not what pax want to hear, then they were more interested in checking their phone than saying good bye to the pax. Very unprofessional. Only consider flying with them if it's convenient but otherwise forget it.
## 1447 Smooth and easy day excursion to Rome from Athens which cost 39.98 EUR return. Some lining up, but no delays and arrival on time both ways. Crew are trying to sell products all the time, but not too pushy. Food sales very expensive onboard, so shop your food/drinks before entering the aircraft (for example a bottle of water is 3 EUR, whilst in Athens airport 0,90 and in Ciampino airport 1,50). More relaxed with hold baggage than they used to be. Read the rules carefully, as any mistake can be paid harshly. Overall a pleasant ride.
## 1448 First time on Ryanair for some time. Had previously had ok flights and one awful flight a few years back. Booked Business Plus to get luggage allowance and more leg room included. Confronted with large queue at Lanzarote airport, however this moved pretty fast. Boarding started on time and having priority boarding meant we got to spend longer on a flight of stairs before boarding started. Seat 17b had lots of leg room and was comfortable. The best part of the flight was the Spanish cabin crew who were very good/friendly. Purchased ham/cheese croissant and tea which were both enjoyable, we were kept up to date by flight crew on arrival times and landed on time. Overall a much better experience than before with Ryanair.
## 1449 I flew once before with Ryanair and vowed "never again". That time, to Nice and they forced me to pay ane xtra \342\202\25450 as bag was 1 inch (according to them) bigger than the allocated size. What they didn't factor in is a steel bar at the bottom of where you place the bag for size. This time I had no option but to use them to fly to Santander. My nerves were in shreds, thinking I was over allowance etc. (I wasn't). I saw people with three and even four carry-on bags. I would consider flying Ryanair again, but still feel aggrieved that I had to pay \342\202\25450 when my bag was clearly within the recommended dimensions. I used the same bag this time, no problem - but was annoyed that some people abused the two bag rule!
## 1450 I paid 25 euros for the Ryanair return ticket, plus 5.99 euros to choose my seat 33A on the flight out, I was allocated 18A (for free) on the flight back. I had printed my boarding passes at home, so no problem to reach gate 7. Boarding on time, no hurrry like in the past, as everybody has now a seat number and takes it. Smiling staff at the door. Communication from the flight deck telling us the flight time, altitude, weather en route and at destination. A two hour flight to Warsaw Modlin, without incident. I went to Warsaw with the "Modlin Bus" just in front of the small terminal (a50 minutes drive) to the Palace of Culture and Science. The return flight was in the evening. Modlin was a bit crowded, as three flights were departing at the same time. Again, boarding on time, uneventful flight, smiling and friendly cabin crew - I had a coffee (3 euros). The flight was not noisy, on a comfortable seat. Landing on time at Charleroi.
## 1451 Ryanair can be good value for money, but read the terms and conditions. Not enough space for tall people, (pay for extra space seats). Food and beverages onboard flights are a little too expensive. Sometimes Lufthansa is cheaper than Ryanair.
## 1452 Flew Ryanair from Birmingham to Dublin in September 2015, flew Business Plus and paid a premium for priority checkin for exit row seats. On arrival, we were advised that we had to checkin at least 2 hours before departure, despite clearly stating that Business Plus fares were excluded from this rule, hence the premium, they than charged 45.00 per person, in total 135 GPB or 297.00 AUD. They wouldn't print the boarding passes until the charged was made to my credit card. We then had to have the seats allocated, at which stage they allocated the same seat to my wife and myself, when we queried, she is no, at which time we advised her to look at the boarding passes, and then she reallocated the seating. On arrival at the gate, we waited in queue under a glass roof which was more like a hothouse, they then open another queue allowing other passengers to board the aircraft, leaving those that had paid the additional fee to wait. It wasn't until the priority boarding queue starting to voice their thoughts that they stopped the other queue boarding. Once onboard, the aircraft seems to be out of the dark ages, excessively old compared to Australian budget airlines. Seats are very narrow and uncomfortable. On seeking a refund for the 135.00, they confirmed the fee was charged incorrectly and would refund. However they wouldn't refund to my credit card, that I would have to wait 3-4 weeks and receive the payment by cheque. I advised that this was not satisfactory and that they should refund the credit to the credit card, at which time they discontinued the conversation and forwarded me to a customer survey. Don't fly Ryanair. There are better budget airlines that deserve your business.
## 1453 I bought 2 Ryanair tickets from Eindhoven to London for 34$ and at the check out instead of 68$ I paid 128.75$ because they added 60$ fees. They don't allow you to check in and print your tickets sooner than 24 hours prior to your flight, so if you are unable to print them when the time comes (it happened in my case since I was in the middle of my trip) they charge you 15euros per itinerary to issue them at the airport which is insane! The staff is rude. We arrived at the airport in the Netherlands and the employee was replying to us in Dutch even though we were talking in English and we made it very clear that we don't understand her. For tickets that were suppose to cost 68$ we paid in total 174$.
## 1454 We arrived at Stansted Airport in plenty of timing as advised when we booked Ryanair our flight, I could not believe the length of the queue for dropping off the baggage which took ages. After dropping off our suit case we made our way through to security, the queue was horendous where we patiently waited. The minutes ticked past where my partner said we need to board by 08:15, it was 07:50 by this time where we continued to patiently wait. In the end we had to catch a member of staffs attention as it was now 08:10 and the last call for the gate closing was made, we were put to the front of the queue. I have diabetes where I had to hand over my insulin to security as it cannot go through xray, he handed it to a colleague who walked off with it. As I went through my insulin had gone, I asked where's my insulin to which no one knew. I did make some noise about this where I felt I was going to be taken to one side, eventually he pointed me in the right direction to his colleague who had my insulin. After collecting my insulin we had to run from security to gate 30 along with many others, it was horendous. We were a few of the last ones allowed through the gate that morning where the flight was clearly late. Ryanair should have prioritised the passengers who were queuing to get through in time, from arrival to the airport we stood for over 2 hours waiting in queues. Ryanair had a nuber of gates closed on the morning we departed which needs to be addressed, if we had missed our flight we would have had to pay for another one. Cabin crew were fantastic hence my rating, however departing was an awful experience which needs to be addressed.
## 1455 Do not book your Ryanair flights through EDreams. They charged me \302\24320 for baggage and for booking the flight. It is a rip off, when I got to the check in. I was told I did not book my bag in and I got stung for 50 euros. Why does Ryanair let a company like this promote them? EDreams can only be contacted via a high premium number and their email is no reply. I know if you get it right with Ryanair it can be a good deal. But the stress involved is not worth it. I would rather pay more next time and have peace of mind.
## 1456 I had not done the Ryanair check in online and got charged 45 Euros at the airport just for filling in a form. I feel like this is intentionally difficult to find while buying the ticket. It is also a very "unusual" charge, you are used to paying for more luggage, but it's the first time ever I got charged for not checking in in advance. I hate surprises as a customer, and I do believe they make it difficult for you to find this information on purpose and then benefit from the extra dollars, once you cannot get out of the situation. There's no way to justify a 45 euro charge for printing a boarding pass and checking a passanger in. Almost nobody's 5 minutes are that expensive. It felt close to a scam.
## 1457 Never again. Not only did they charge me 50 euro at the airport for not checking in online, all of the Ryanair staff I dealt with at Bati airport were so rude and disrespectful towards me. As a young girl travelling alone not knowing the language this was upsetting and extremely uncalled for. One of the worst flying experiences I have ever had. I am really appalled by Ryanair behaviour today.
## 1458 For a one hour flight, Ryanair were not the greatest. It's nothing to shout home about. However, because we forgot to check in online, we were stung with a \302\243100 charge at Luton airport, and this took a big chunk of our holiday money. The flight was smooth, and we were glad we booked priority seats, because flying with Ryanair before, we were well aware of how uncomfortable the seats can be. However, they are not exactly the most comfortable of seats at the front row too. The staff were very nice. The price of the food was too expensive. It cost us \302\2435.50 for a ham and cheese panini, which was priced as \342\202\2545 in the brochure. Our flight was \302\243200, and all of those charges on top of that was not worth the time or day for a one hour flight. After going through that, this is the last time we are flying with Ryanair.
## 1459 I booked our flights with Ryanair months ago via their website. All seemed to be fine until I tried to print out my boarding passes that same morning as our flight. I tried several times but their site would not complete the process and I had no choice but to leave for the airport. Ryanair charges for printing up boarding passes at the airport (20 pounds a person) so I went to the customer service desk and explained my situation to them. Without blinking an eyelash, their service person said there was nothing she could do and I had to pay the charge regardless. She even called my honesty into question. While we were waiting in line, we had conversations with 2 other passengers that encountered the same problem. Reviewing others comments online, I can now see that this is an ongoing complaint with Ryanair. I will challenge this charge with my credit card company, but for now I just want to alert others to this scam. This is a budget airline and they live up to the title, the seats did not even recline (at least on our flight) and their customer service should be call customer disservice, just horrible.
## 1460 On-line check in, bag-drop at airport all good, flight on time. Though its a budget airline, the seat leg room is still good, cabin crew friendly. Ryanair provided the cheapest airfare.
## 1461 The worst check-in experience I have had. They charged me 40/50 EUR at the airport to check in without any baggage. The inflight experience was poor, the seats look like plastic. Yes its a low cost airline but I have flown low cost airlines and none has been this substandard. Will avoid it by all costs unless they are the only airline flying to my destination.
## 1462 I flew with Ryanair 6 years ago to Italy and vowed I would never use them again. I broke that vow as they were the only airline who flew into Jerez. They have improved their service both on the ground and in the air. The young crew showed exceptional customer service throughout, smiling and joking with passengers. Hopefully other Ryanair crews are up to that excellent standard. We will certainly use you again after this service, and I just hope it wasn't a one off.
## 1463 We arrived at Stansted after an earlier long-haul flight from New Zealand. Unfamiliar with Ryanair online check-in and baggage check procedures. Noted one free checked bag (11kg) and was gobsmacked to be charged \302\24350 extra for desk check-in and \302\24345 for baggage check-in. This more than tripled the cost of the flight. Even if I mastered online check-in, I would never use Ryanair again and will advise others to not make the same mistaken choice.
## 1464 Manchester to Shannon with Ryanair, and the boarding process was relatively smooth bearing in mind the airport was congested. Flight left on time and arrived early so the experience could not be faulted. Scores are based on my expectations for a one hour flight.
## 1465 Our return flight to Stansted was due to leave Corfu on 20th September at 10.30pm. We arrived on time checked in and flight was on indicator board. Went through security and in to departure lounge indicator board showed delay, one hour later indicator board showed diverted. Ryanair reps were very evasive, passengers all upset given a food voucher for 5 euros could only have bottle of water and cheese sandwich and passengers told flight would not be leaving until 1pm Monday. Ryanair staff said had a technical difficulty passengers told to go to arrivals area. No further information. No reps to be seen and had to sleep, or should I say try to sleep, on airport seats. I am 76 years old and found it very uncomfortable and painful. Monday morning arrived plane on tarmac watched by the passengers was being repaired - okay, there was a thunderstorm on Sunday night but it was hot dry and sunny from 8am on Monday but the plane was still not ready to fly at 1pm. Finally flew back at 3.45pm. Asked for a cup of tea on the plane, told I could have a cup of tea but no milk or sugar on board. Will never use the airline again given forms for compensation not worth the paper they are written on no compensation due as delay was supposedly due to unusual circumstances quite sure they will have received many complaints about this flight. Another plane which was delayed (easyJet) all the passengers on that flight were taken by coach to a B&B and they flew out the following morning long before Ryanair finally flew out.
## 1466 After paying \302\24370.00 return for my Ryanair flight for travelling in June 2015 I was disgusted and dismayed to find that Ryanair have hiked up their prices for exactly the same travel dates in June 2016 to over \302\243200.00 return. After emailing to ask for an explanation for this extortionate price hike - given that oil and fuel costs are at one of their lowest - I was dissatisfied with their response that they always offer the best price on their website (where else would I be looking?). The following is their list of price determining factors : number of passengers already booked on a flight : flight time : Day of travel : time of year - high season/low season etc. Given that we are travelling on the same flights and the same period which have virtually only just become available I fail to see how such a price increase can be justified other than pure greed and the mindset that they have a captive audience. As the accommodation had already been booked we had no option but to book Ryanair on this occasion but I can assure them that it will be my last flight with them. Shame on you Ryanair and goodbye.
## 1467 Travelled about 3 times a year for last 3/4 years and found service and punctuality good. Tenerife South to Prestwick on 5th September with family members and unfortunately took a heart attack at cruising altitude. Flight crew and cabin crew pulled out all stops and thanks to their professionalism I am here to make these comments. Ryanair is economy flying but when it came to important issues the staff were well rehearsed and diligent.
## 1468 First time with airline since 'be nicer to customers' project. Efficient crew, no information from the flight deck after departure, took off late due to slow baggage handling but made up time in the air. Paid extra for emergency exit seats - money well spent. All in all a good experience.
## 1469 Malaga to Leeds Bradford with Ryanair and the flight was cheap and the staff cheerful. Since the airline changed its policies it has improved enormously. It was on time, my only moan is that they ran out of coffee, which is rather stupid. Coffee doesn't go off, so why not have a bigger stock?
## 1470 I have been flying Ryanair from Dublin to Liverpool for some time due to work. The busy Friday evening flight from Liverpool to Dublin I took last week was no different to usual. Online checkin is very easy especially if you download the free app - it will cost you if you forget to check in on time or for some bizarre reason you believe that you don't need one and turn up at airport with just your luggage, passport and a smile! The ground staff checked tickets and passports. If for some reason you decide to bring large baggage with you, you will be charged. The airline are far less strict about size and number of bags carried these days. Ryanair staff are patient in my experience, they take alot of abuse from a minority of passengers who can't be bothered following basic rules. The flight is short. Inflight service is as you'd expect of a 35 minute flight. A steal for \302\24340 return.
## 1471 Flew Ryanair from Dublin to Malaga for holiday. Booked seats and priority boarding only to ensure cabin luggage was nearby and quick exit. Flight out was delayed due to spillage by passenger on arriving aircraft. Ryanair build extra time into their flight schedule so delay didn't effect arrival time in Malaga. All crew were pleasant, especially on the return leg to Dublin. Return flight was ahead of schedule. I love that the seats don't recline and impact on your space, however seat pitch is tight but bearable. My big worry with the both flights is the amount of luggage now allowed on board. Aside from the overhead lockers been packed with luggage the floor space was extremely congested to the point I felt trapped in my seat if there was any emergency. Aside from my worries all went well. Good service and reasonable price.
## 1472 Bristol to Chania with Ryanair. Online check in, so got to airport in plenty of time, but lines getting through security so long we almost missed flight! Gate almost half an hour away from security. Usual melee on board, staff pressuring people to buy rubbish food, drinks, duty free goods and lottery tickets (and complaining loudly to each other when failing to do so!) Big problem when we came in to land at Chania airport. Pilot failed on first attempt - think he was travelling far too fast for runway - and despite perfect weather conditions, we had to climb again and were then an extra 20 mins in sky and ten mins landing. No explanation given by crew, lots of people worried in case it was a pervasive mechanical problem (unable to drop landing gear for example) or just a careless pilot - neither are happy thoughts to have as you circle your destination! So no phoney, fixed "on time landing" song to endure, but no apology or explanation either. Ryanair needs to be a bit more accountable and cabin crew need to have some consideration for their customers.
## 1473 This is a review based on my Ryanair experiences at Madrid Barajas airport on 23 September 2015. I arrived 2 hrs early at around 1130 for the 1335 flight. At around 1300 our Boarding Cards were checked and we went down the ramp to embark. At around 1320 we were asked to return to the Departure Lounge due to a technical issue. For the next 3 hrs we were not advised of the issue nor of the plans to get us back to the UK. Gradually over that time people would ask the 2 (relatively junior) staff members of Ryanair and 'news', or lack of it, would filter down the line. No announcements were made. By around 1700 we heard that a plane was on its way and we would depart at around 1930. Ok, 6 hrs delay but at least we'd be home. The 2 officials then handed out photocopies of the EU regulations regarding flight delays etc - useful, but to be honest we just wanted to get home! As can be imagined, people then were asking lots of questions of the 2 lads. At around the same time food vouchers were being handed out and stamped by the 2 officials. However, not one of the food outlets would take the vouchers because Ryanair had tried this in the past and had not paid their bills to the food outlets! At around 1830 the 1930 departure disappeared off the departures list. We heard that another flight had been delayed and our rescue plane had been used for those passengers - presumably to avoid 2 sets of compensation!! Time progressed slowly, we then found out that a flight would take us back to the UK around 2305. The flight actually left at 2330 - 10 hrs late. During the 10 hrs, the 200 or so customers were shunted at least 5 times between Gates - can you imagine 200 people racing around getting from A to B! Ok, these things happen. Lessons to be learnt? Ryanair, have someone on the ground such as a manager to deal with the situation and inform people officially by adequate communication. Pay your bills to the local food outlets. Having reported all the above, I've travelled extensively for the past few years to Spain and back and used Ryanair a lot. Mostly they are cheap and get you there on time; its just at times such as the above where you realise their service is quite flaky. I hope this accurately reflects events the other day and it will help someone in some way.
## 1474 Ryanair was great value for money. Only problem was as we were amongst the final few to board we were unable to find a space for one of our bags in the overhead locker. As a result my husband had a very uncomfortable flight home with the bag at his feet. I noticed several handbags had been placed in the lockers and thought the cabin staff could have asked the owners to move them.
## 1475 I won't fly with Ryanair again, I was duped by the price, but nothing is worth the stress of flying with them. I had to be at airport for 8.45am flight so left home at 4.30am to be able to get there, park and get to airport on time for my trip to Glasgow. But the plane was delayed for "technical reasons " and we took off 2 hrs 55 mins late of our flight time, conveniently just before the 3 hrs when we would have got a refund. Worse than the delay was the information coming up on the board, the expected time changing and then the realisation that it was possible they could just cancel! And the not knowing was unbelievably stressful. Lots of people had weddings to go to, tickets to the tennis etc, it's an hours flight it is not unrealistic to think getting an early am flight, you will be there for midday at least! We arrived at 1.30pm, but at least we flew which I guess I was just relieved about that. I won't put myself through that stress of not knowing again.
## 1476 I have flown Ryanair regularly over the years and generally have had no cause to complain, but yesterday's flight from Manchester was delayed by 2 hours. This meant I had to take a taxi from Dublin airport to the railway station instead of public transport. I still missed my scheduled train on which I had prepaid for a first class seat. I had to pay again for a seat which was not first class and arrived at my destination of Waterford too late to fulfil a previously arranged engagement. On top of this, I understand I am unable to claim compensation because the delay was under 3 hours!
## 1477 I will never fly Ryanair again. We wanted to check in at the airport, but surprisingly that is was not possible with Ryanair from 2 hours before scheduled flight. So we had to go to the check in counter and pay 50\342\202\254 per person in service fee. What a scam! The business model they are running with having different rules than general airline companies are very confusing.
## 1478 Flew Ryanair from HHN to OPO. Not enough counters at the check-in but flight still on time. Beverages are expensive. The lottery is annoying. Seats are very uncomfortable. Go for the extra leg-room in the first-row.
## 1479 Once again a great flight with Ryanair from Liverpool to Barcelona El Prat. On-time and did what it said on the tin. For \302\24327.99 to do nearly 1000 miles on a plane is such a steal of a price. Just stick to the rules, terms and conditions etc and you will be flying high with a smile on your face. I have never encountered any problems with Ryanair, apart from a weather issue, but they can't control the weather can they?
## 1480 The definition of a love-hate relationship. Ryanair service has improved in recent years, but don't expect it to be "good" in any sense of the word. However some of the flights are absurdly cheap. I paid 34EUR for a roundtrip flight from Barcelona to Porto, Portugal two days before departure. I can't get a roundtrip taxi cab across town for that price. You must be very careful of their tricks, especially if you're not an EU citizen. Show up early, weigh and measure your carryon, print your own boarding pass, get it stamped at the desk (if you're not from the EU), read all of the fine print and know exactly where the airports are located. They're usually very far from the city they claim to be. I once flew into "Dusseldorf" according to Ryanair. In reality it was a city that was a 2 hour drive from Dusseldorf. Seats are hard and cramped, food is pricey, they bombard you with advertisements throughout the flight and ground service is a joke (but improving. They no longer "actively" make your experience bad like they used to). You get what you pay for.
## 1481 Valencia to Bari, and fine return flights with Ryanair. The flight was full both ways, so boarding was a little chaotic, but this was more due to passengers dithering rather than any other reason. The flight was smooth, on time and with no issues. The cabin crew were friendly and polite. I cannot remember the last time I heard "may I help you with anything else sir?" on an airline.
## 1482 Apart from the price I can't think of any positive aspect of Ryanair. The crew was in such a hurry that procedures like other airlines have are not respected. No explicit cross-checks, no orders from the captain, no visual purser on board. Crew was working individually and had language issues between them. On this flight, neither a German or Spanish native speaker and a level of English that has to be questioned. Boarding procedure chaotic, took therefore more than 40 minutes (both ways), no gate in Cologne, although aircraft was parked next to a gate. Arriving in Madrid taxiing at highest speed to gate, aircraft parked to far from gate so it took 20 minutes to connect. I would not like to fly them again.
## 1483 The Ryanair flight was 35 minutes late in departing, there were no hot meals onboard and the cabin crew could not care less about the situation, despite it being a 3 hour 20 min late flight. They ran out of ice when finally they came round with a drinks trolley 90 mins into the flight. It said on every seat back that receipts were issued, but they can't or would not do that.
## 1484 A very good experience on a nearly new plane. Clean cabin and professional cabin crew. It's not the best seat pitch for me (I'm tall 186cm), but it's ok for a 1 hour flight.
## 1485 Ryanair is without a doubt the worst airline I have had the misfortune of flying with. We got to the airport at East Midlands in plenty of time and went to Ryanair check in desks, which took up a good third of all airport check ins. They decided to try and book 4 flights through at the same time with 3 staff! After 2 hours stood in a queue we got to the front of the queue and again another porter came this time trying to book a disabled woman on in front of us - the woman had walked down with her husband and was sat on a chair smiling. I said to porter what are you doing? He replied booking them on! I'm stood on walking sticks and had been waiting 2 hours. So we had 15 mins left for food and toilets before boarding. The planes have no legroom, the organisation is rubbish and staff don't care less. I will never fly with them again. Couple told us they were asked to clean the plane when they flew with them the week before as they hadn't had chance to clear up from the previous flight. And they had no drinks left as they had been busy.
## 1486 As a Ryanair novice, I wasn't looking forward to this trip. Surprisingly efficient and on-time. Short flight but full service (paid for) provided. Didn't like the constant announcements. Tight seat and leg space, but for a thirty minute trip this was not a problem. However I couldn't imagine a longer trip would be comfortable. Does what it says on the package getting you from A to B.
## 1487 The section of the Ryanair check in desk had a Ryanair information desk which I needed to go to, but was closed. We were suposed to board at 5:35 but we ended up boarding at about 6:05 and it was an airbridge. The flight didn't depart until 6:45. Onboard the flight was smooth, comfortable seats. When landed, we were using the steps but they didnt open the back door so everyone had to leave through one door.
## 1488 Ryanair may be "low cost" but their tickets are not necessarily cheap (sometimes more expensive than BA for example) by the time you have paid quite large sums for the privilege of travelling with a bag etc. They are most certainly cheap when it comes to airport services and very expensive for anything purchased onboard. The check-in process at Birmingham was perfunctory but quick, security a fairly long process as usual with inadequate staff, and boarding was fine until we stood in the airbridge for 15 minutes only to find that it was not connected anyway and so then had to descend the steps on to the ramp before going up the airstairs on the aircraft - certainly not good for the elderly and/or infirm. Similarly in Murcia, check-in was ok but long queues had formed by the time staff turned up and we were made to stand in the hot sun for 20+ minutes until the crew deigned to let us on board. At Birmingham once again no airbridge. All very convenient, I am sure, for Ryanair but not so for their customers. The cabin crew were amateur at best and seem to be there mainly to extract more cash from the passengers : all their prices are ridiculous and a claim that perfume etc is "40% less than the high street" is at best disingenuous. On the positive side the aircraft are clean, albeit uncomfortable, and the flights operated within 30 minutes of schedule. They do more or less what they say on the tin - but do not have any other expectations, take your own food/drink, purchase nothing and prepare to be de-humanised.
## 1489 I flew Ryanair from Stanstad to Athens return, and was aware of the aspects of luggage weight and hand luggage, printing boarding pass etc, and all went smoothly. Ryanair is a budget airline at a good cost so am well pleased. Read the terms and conditions and all should go well.
## 1490 Over the years I have flown Ryanair many times. I know of the fees tacked onto the cost of the ticket and travel accordingly. What was out of the ordinary and an exception to earlier trips was the cabin crew member sitting at the front. During boarding he attempted to assist a gentleman with his baggage, attempting to place it in the first overhead bin on the right side. After some grunting and shifting of bags that were already in the bin, the cabin crew cursed outloud more than once. In addition to the lack of a filter, the cabin crew appearance was less than polished. He needed to have tucked in his shirt before the boarding process started and perhaps rechecked his appearance before the live demo.
## 1491 Three elderly ladies were refused entry to this Ryanair flight from Stansted to Kos for being 30 seconds late, one of whom was disabled. My wife had just gone through and they could literally reach out and touch her, Ryanair is a terrible airline which in the long run costs more than most full service airlines after all Ryanair add-ons.
## 1492 You get what you pay for with Ryanair, we paid \302\24350 for a return, cheap and cheerful. We were only on the plane for a couple hours, the seats aren't the most comfortable but again, you get what you pay for. The staff were all seemingly polite, do their job well. The airport service was quick and easy no problems, infact we even arrived half an hour early on the way home and made an earlier coach. If you don't mind about luxuries and just want a cheap and cheerful flight that gets you from A-B then Ryanair is great. I wouldn't recommend travelling for more than a few hours.
## 1493 Not knowing that I could be charged to check in, I went to the Ryanair baggage check in desk to check in only (no baggage) and the woman there would not check me in saying that I need to do it on my smart phone for free, or on their kiosk for \302\24345. I failed to do it online and went to the kiosks. There were 4 of them, 2 would not work, one was working badly and the 4th worked ok. It cost me the \302\24345. If I had known about this charge and the problems involved earlier, I could have done it online at my hotel, but Ryanair would not get their silly hidden charge of \302\24345, which made the flight dearer than Air Lingus, who did not have any charge for this the last time I flew with them. I will never travel with Ryanair again over this. I expect the cost paid before the flight to be final.
## 1494 Due to the closure of a section on the M25 we arrived at Stansted with only one hour to go before our flight left. Knowing we were in trouble and seeing the hundreds waiting to be checked in, I joined a queue at Ryanair customer service to ask how we should proceed. Mrs miserable at the 'Here to Help' counter uttered that same litany, as if we had arrived late on purpose just to annoy her - "Check-in opens 3 hours before you fly". Her head twitched sideways and she announced "check-in 80' (where another long queue was waiting), then turned her back on us. When our turn finally comes after one assistant has closed up and gone home leaving only two operating, we are told we are too late and the gate is closed. If you want a bad situation made much worse then fly with Ryanair. Of course this is a very lucrative action by Ryanair as people are then offered - "as a gesture of goodwill" the chance to buy another flight for \302\243100 per head.
## 1495 This morning I received an email from Ryanair encouraging me to check in for a flight to Denmark. There are three of us in my party. Having filled in all the boxes with passport details etc (including expiry dates which I had to ring round for) the screen timed out and I had to start again. Having all the details to hand it didn't take me long to get to the next screen which told me that unless I purchased allocated seating, I couldn't check in until a couple of days before the flight. What is wrong with these people that they can't tell you that before you go through all the hoops.
## 1496 To celebrate my wedding anniversary I book a few nights away with my wife as a surprise. The trip was book on Friday 11th Sept to fly on Sunday 13th Sept. I was told to check in online and despite several attempts where I kept receiving a message saying my itinerary was not found, I contacted the airline who advise to keep trying and as a last stop check in at the airport. I had a further 9 attempts to check in online only to receive the same message. This morning I get to the airport and join the huge queue of people waiting to check in. By the time my wife and I get to the front I am informed that check in had closed 13 minutes earlier. We had been queuing for nearly an hour and we could not check in online despite all of our attempts. I showed them the correspondence I received from their own staff about our difficulty checking in. Despite our efforts we were turned away. I spent nearly \302\243900 on a wasted trip as the Ryanair online system and staff was appalling. I wanted to complain to them both in person and though their online system. I was told nobody was available at the airport and their stupid once again records nothing ref this sort of complaint.
## 1497 We had the worst experience with Ryanair last month. To begin with, they do not have airport check-in and boarding pass printing. Their system is based on the customer bringing his/her boarding pass ahead of time. We did not realise this, and they send us to pay 50 Euros for each ticket (for a family of 5 it was 250 Euros). Payments are done in a different "office", so I had to go there and stand for 20 min in a very unorganized line. When I came back to check-in the agent was very upset that we didn't pay for our suitcases, almost yelling at us. Guess what? we didn't know about this as well. So now she sent me again for the same "office" to pay another 200 Euros. Now, however there is only one line instead of two, so it takes another 30 minutes to pay the fee. Overall, their service is the worst that I've experienced. They make you feel as if they are doing you a favor for allowing you to fly their planes. I encourage anyone who wants to fly at a low cost not to fly with Ryanair. Overall it comes out to a very expensive experience.
## 1498 Ryanair uses the motto Low Fares Airline as a trap, to be honest. We bought our tickets for a short domestic flight for a good price. However the ridiculous add-on charges (55x4 euros per check-in at the airport fee + 67euros for a 22 kg luggage) made it cost much much more. I understand the luggage fee. However 220 euros airport check-in fee is twice the price of our total ticket cost! Finding this cost info on their website is almost impossible (it is literally hidden on the website - you have to search for that particular thing really). Their "don't forget to check-in online" e-mails can easily be ignored because they don't mention any airport check-in fee. It looks like a choice, not a must-do. At least three more couple of people paid that meaningless fee. Because they were not aware of it. If this airlines were for budget travelers and really cared about customer service, they would warn travelers about those ridiculous add-on fees. A fee should offer a service, so its value should be reasonable compared with the service it gives. So we paid 220 euros for a single check-in (not four - because normal airlines do a single check-in per reservation) done by a sour-faced check-in officer who scolded us like we were little kindergarden children. This is not an acceptable service. Like another couple said on that day, "Never again"!
## 1499 We were charged 180 Euros (for a family of 4) because we were unable to complete the online checkin (website kept timing out when we tried from an internet cafe despite no other problems doing any other internet related jobs there). When I got to the airport and explained this, the lady at the desk that handles Ryanair at Lisbon said that it happened a lot and that Ryanair would refund us if we made a complaint on our return. We waited over an hour to check in, as only one guy was managing two flights, the flight sat for more than half an hour on the runway at Stansted and was possibly the most uncomfortable flight I have ever taken. Not only have Ryanair not refunded us, they haven't even replied fully to my concerns. Each time I write in, I get the same standardised response about terms and conditions. I wonder whether this is strategic so they can dupe people into running up fees with their tricky online checkin service. Never again.
## 1500 We arrived at EMA exactly 2 hours before check in which was great. There was already a large queue at check in but we accepted the inevitable and joined it with about 100 other passengers in front. I was shocked to see only one counter open and 2 staff. I thought ok, must be fairly fast, but no - after having moved about 4 feet in half an hour I began to worry. I noticed the Ryanair desk across the hall so went over to ask when they were opening the other 2 check in desks, they said they didn't intend to. I explained we were worried about missing the flight and were told, once you are checked in the flight will wait for you? Anyway about 1hour 30 mins later we finally got our bags checked in then we ran to the next stage, bear in mind we had 3 OAP's and an 8 year old to deal with so running isn't exactly an option. We were told to empty all contents into the little boxes and go through security. After 40 minutes we got through security only to realise they were calling last boarding call for our flight. Our flight was at the end of the terminal, (when aren't they) so we had to leg it as fast as we could, now again, 3 OAP's me on crutches and an 8 year old trying to run through EMA to catch a flight that we had queued up for ages to get. Given that we did finally manage to get on board, I would not recommend either EMA airport or Ryanair for future travel. I would rather pay an additional charge to fly from another airport with another company. If there was an option for 0/10 I would give it zero.
## 1501 Ryanair is the worst airline I have ever flown. We payed 344 Euros for short 40 min. return trip fight. When we got to the to the airport we had to pay 45 more Euros each just to have a boarding pass printed. We were traveling around Germany and Spain and didn't have access to computer printer, unaware of their policy. I've traveled the world and never heard of anything like that. They herd them in like cattle. There is basically no service and you pay extra for everything. Flight was late which almost caused us to miss connecting flight. Absolutely no one is available to help or answer questions.
## 1502 Ryanair flight from Zadar Croatia to Dublin was probaly one of the most uncomfortable flights I have been on. There is no pocket to store your items such as your phone etc, this is the stupidest thing I have ever seen on a commercial aircraft, the seats are filthy - there was chewing gum stuck to the seats in front of us and certain parts of the chairs in front of us had a lot of dirt on them. Window seats are really uncomfortable I could not sleep because I had nowhere to rest my head as the seats are flat and comparable to rocks. This is the only airline that flys from Zadar to Dublin so we had no other choice and I understand it is a low cost airline - however, other low cost airlines at least clean their seats and provide a pocket for your stuff. We plan to never fly with them again as we are taking a flight from Belfast with easyJet to Split which is closer to our location in which we stay in.
## 1503 I should have been on this flight but 15 days before flying it was cancelled together with the return flight from Italy. Apparently they can do this and there is nothing you can do about it. They claim it was done for operational reasons. I was unable to contact them and had no choice but spend double my original fare in order to book flights with another airline. However, the flight still left on the day it was supposed to. Of course my seats had been resold at twice the price I paid (they were advertising them the day after they cancelled my flight). Despite 3 emails complaining to Ryanair they have given me no explanation for telling me my flight was cancelled when it wasn't.
## 1504 The Ryanair staff are friendly, but this is the only positive thing I can tell about. Less space between the seats, the food is bad and too expensive. Even drinks (with or without) alcohol are not to enjoy. They try to sell the food and drinks all the flight. Before flying back to Germany, we waited for about an hour for just checking in the luggage. Staff problems was the reason, just 1 person had to serve 3 counters.
## 1505 The Ryanair fleet seems to be ageing badly. Over my 12 flights in total, the delays were under 50 minutes, so really not bad, never had a technical fault or other incident. However, the quality this time around on our Arrecife flight was lower than it was 2 years ago, the age of the plane was 3 years, however the interior cabin looked shabby. The flight was again without incident, but the standards of aircraft interior are now much lower than say the easyJet flight I took 2 weeks prior. All in all you get what you pay for, although saying that, I didnt get a cheap flight here - paying for Priority (my choice I know, but with 4 Children!) put the price up, perhaps families could get first dibs at seats?
## 1506 For some ridiculous reason, using Ryanair online check-in which is mandatory, you need to re-enter all passport info again into the same system that already stored it when tickets were purchased. I again entered all info for our family of 8 and the website timed me out. I tried again, saving the info as I went along but their system does not allow saves. Again, timed out with an \342\200\230error\342\200\231 page. At check in we explained to a Ryanair agent what happened. She rudely told us this was not their problem and we had to pay extra. We were sent to pay for one bag and a check-in fee, amounting to $630Cdn, more than the price of 8 flights! We were told if we prove an \342\200\230error\342\200\231 page on the computer they would refund. We showed them the error page. They wouldn\342\200\231t accept it there and forced us to pay up front then call customer service for a refund. We did, and received a stock email and refused us a refund. Everyone we dealt with had a superior couldn\342\200\231t care less attitude. They lied about a refund being possible. As a business owner, this kind of service appalls me. This whole episode left a bad taste in our mouth and coloured our first trip to Ireland. We will never fly Ryanair again.
## 1507 Due to my taking over my daughters ex partners seat had to pay \302\243170 for this Ryanair flight. This was purely for a name change. Although Ryanair say they only charge \302\243110 (!) they charged \302\243170. So the holiday was more expensive than by flying with a normal airline. As I have read previously, had to pay for returning seats as couldn't print boarding pass until we arrived at holiday resort. So found this all a rip off. Due to previous flights with Ryanair I wouldn't have booked this time but it was already booked with Ryanair. Would never fly with them again. Most uncomfortable on the flight too, no leg room and our hand luggage was halfway up the plane as the flight was full.
## 1508 You should be very careful when choosing Ryanair. You will buy a ticket within Europe and the currency adopted is the country of the departure, which is a normal proceedure. However, the currency rate they use to charge you is different from the official rate! Which leads you to think you are paying X, but you are actually paying X + 100. In the end the flight cost me as much as full service airline, but I got the worst service. I did not get a glass of water on my international flight with Ryanair. I emailed them about 15 times before the flight to explain there was a problem with the amount they were charging, which was a totally different amount. To add a bag on the website is supposed to be 45 euros, but they charge 56 euros, I never understood that, and they never answered why. Their replies were nonsense emails not answering my questions. At the airport I found out why, because their ruddest staff had the courage to say "You chose to fly Ryanair, so you have to pay as much as we say it is."
## 1509 I was travelling with a family group including three children under 5. I anticipated a delay from Palma and so I was not surprised when we took off almost two hours past our due time. At Palma, after having our boarding passes checked, we then went into the glass walkway to the aircraft and stood waiting in the same place to board. This glass walkway was in the full sun with people using anything for a fan and given no reason for this. I was very concerned for my baby granddaughter who was sweating profusely and we were in this situation for approximately 15 minutes. Why did that happen, could we not have been held back in the departure lounge. It was appalling and of course no offer of any water. On the flight there were members of staff, or I assume they were, who were helping uniformed staff but one was in shorts and t-shirt and the other casually dressed. To state sloppy is an understatement, it was appalling. These flight were not cheap as they were in the peak summer period so no consolation there. Appalling
## 1510 Everything fine if a tad expensive when you are trapped on the aircraft. On return flight had smaller bags stowed in the hold free. My point of contention was the fact that when you go too foreign shores where you know no-one the difficulty in getting returning boarding passes printed and for that reason I will think twice about using them again unless they change their rules and the outward and inward passes can be printed before leaving home.
## 1511 An extra 180 euros we had to find to get our boarding passes so we could get home, if you don't pay the extra charge you don't fly. You must print off your boarding passes 48hrs before you fly and if you don't have access to the internet you will be charged 45 euros per person. This is in the terms and conditions. Why when we printed the outbound tickets from Manchester to Malaga wasn't I able to print inbound tickets at the same time, that's just common sense to me. We were lucky this was the only thing they could charge us for, if your luggage is to heavy its 10 euros per kilo.
## 1512 I have traveled many times with Ryanair this year, all flights were on time and arrived on time. I would like to share a incident which we had in Prague airport when I was travelling with my wife and daughter. We went on holiday for a week from Brussels to Prague and then came back from Prague to Brussels on 19th August 2015. We lost our passports in an OBB train in Vienna a day before our return flight. Apart from my Belgium residence card, we didnt have any original proof of identity of my wife and daughter, the staff who manage Ryanair in Prague were very helpful along with the Immigration police officers who helped us board our flight. I really thank Ryanair staff and the staff of the company which manages Ryanair services in Prague airport. We finally found our passports and the OBB staff delivered the same at our residence in Belgium. I would strongly recommend Ryanair.
## 1513 I fly every week, about 50 times a year. Italy-Belgium, and always on Ryanair. Do not understand all the complaints about this airline. Almost every flight on time, crew as friendly as any other airline, food: never tried, because of very short flight. Comfort as good as the 'regular' carriers on the Italy-Belgium route. Last but not least, I save hundreds of euros thanks to Ryanair.
## 1514 Flying from Stockholm to London is a short flight so I thought I'd try and save a few bucks by travelling with Ryanair rather than one of the regular airlines. Check in were okay if you don't mind broken seats, a dirty airport and a customer service worthy of the ice queen herself. I'm not a tall man but I could not fit my legs in the seats under any circumstances. Flight personnel were horribly aggressive trying to push peoples bags in the overhead compartment. I would not recommend Ryanair.
## 1515 Ryanair has a policy of printing your boarding pass prior to your flight which obviously includes web check-in. If you fail to do so, the airline charges an absurd amount of 45eur per person. While it does mention to web check-in on your ticket, first time goers are bound to face problems. The staff gave us a deaf ear on us when we kept saying our web check-in kept failing a night prior inspite of repeated attempts. Neither was the ground staff smart enough to tell us how do we go about paying for extra luggage and boarding passes. There are different queue for these. Remember to carry a Credit card as they wont accept cash. You cannot carry beyond a certain weight hence a small bag is always preferred here. Overall experience - 1/5. If only were they more friendly to 1st time travelers.
## 1516 Outbound 18th August, inbound 25th August. Check in very efficient at Bristol and Malta. Both flights on time. Cabin crew very friendly. Purchased some inflight drinks and food, and happy with both.
## 1517 Quick boarding, smooth flight, good landing, only the seats let Ryanair down. Apart from this journey I have made many flights with them from Marseille to several countries and have no complaints.
## 1518 First time flying with Ryanair, chosen for the best price for our journey. No problems checking in etc but to get boarding passes to return you gave to either pay extra or print them off while you're away. Managed to print fine but would probably pay next time to make things easier. Did the airline get us from A to B safely with no hassle? Yes they did so won't have any qualms about flying with the again.
## 1519 We flew with Ryanair returning from Dublin before our flight to Palma. I was surprised despite the reviews. I dont think the reviews are fair. The terms regarding boarding passes are clear and the technology savvy can easily find out this information. I see one review about using apps to check in with other airlines, so why such a tech block with Ryanair? They have an app, it reminds you of your flight even without, and the email in gmail tells you to check in (gives a link) follow the link and it tells you to print, or download boarding pass. Anyway, extremely efficient. Which was wonderful with 3 kids in tow. I cannot complain whatsoever. The luggage was not a problem again you just have to be savvy and dont try to go over just incase. But in my opinion unless you've got gold bars in the allocated sized bag there's no way. I put all my heavies in the 2nd bag. We fly again with them next week and will do again and again.
## 1520 I am not a regular user of low cost airlines but on this occasion used Ryanair on due to the holiday destination airport (Chania, Crete). The check-in clerk however could benefit from a refresher course in customer service as he appeared extremely bored and disinterested. However my complaint starts when we did not print off our return boarding passes in advance of the holiday and although we tried to reserve our seats for the return flight, so my family could sit together we were unable to do this via their web-site. We gave up after 2 attempts and assumed we would check-in on arrival and take whatever seats available. We of course were not aware that they would be an additional charge for printing a boarding pass and was advised by the desk clerk to check-in on-line, again we tried to do this via our smart phone but again were unable to access the booking on the web-site. As we had spent a considerable amount of time and with mounting stress from my wife, I was forced to pay the additional charge. The 3 boarding passes were duly hand written in 10 minutes by the Servisair clerk and 135\342\202\254 extracted. The clerk even told us we were lucky to get the last 3 seats even though we had booked and paid for them. I find these charges levied by Ryanair are totally disproportionate to the administration involved and are punitive in the extreme and are extracted under stressful circumstances. Up to this point we had enjoyed a fabulous holiday only to have it spoiled on our return. I have a number of issues with this penalty charge, firstly; it is not clear on their web-site when making the on-line seat reservations and printing the boarding passes for the outbound flight that you need to make the same arrangements for the return flight (or is it Ryanair\342\200\231s intention to catch out the new customers?) and secondly, I regularly travel for both business and pleasure with a number of different airlines and have never come across such a policy for boarding passes. I regularly use on-line booking and the barcode via smart phone but generally this is within 24 hours prior to departure and I have never been charged for a boarding pass, this is not the industry norm. I made a complaint to Ryanair and got a stock answer hiding behind the T&C's and no refund. Still valuable albeit expensive lesson learned never to fly Ryanair again.
## 1521 I would just like to say that I have flown with Ryanair now for a number of years, have always left and arrived on time, I think there is too many negative reviews but I have always been happy with Ryanair and I recently had to go to London on work business which was with another airline and was delayed both ways. Ryanair is a no frills airline but the staff are attentive and pleasant.
## 1522 My very first time with Ryanair, have previously tried to avoid. However, very pleasantly surprised. Hand baggage only and online check-in worked superbly. Upon arrival at gate, boarding was speedy and professional, thats all that is required. All boarded on time, but then informed of approximately 1 hour delay to ATC in Spain. Not the airlines fault and Captain continually updated us. In fact his best update was yet to come. Finally departed bit sooner than originally informed. Inflight service again professional and courteous. Yes, prices can be slightly high, but they are on trains too, but not too over priced, in my opinion. Certainly was no strong selling on this flight. Further delay as we approached Palma, this time due to the weather, but again superbly informed and updated by the pilot, who made sure to tell us we had enough fuel of course. Eventually arrived approximately 1 hour late, into a torrential downpour, thankfully to a stand and not a remote stand with bus trip. I was impressed with Ryanair and indeed the little comments and humour from the flight deck ensured that though we were delayed, not due to Ryanair actions, probably made the experience less stressful than it could have been, I have now become a fan and would use once again.
## 1523 My husband and I flew with Ryanair, we had printed our boarding passes arrived to check in our luggage. We joined the line with one medium case we had paid to put in the hold and one cabin sized case. A Ryanair representative approached us and told us we could put our small case in the hold for free, I explained it had my medication in and that I would prefer to keep it with me in the cabin, she became quite annoyed with me when I refused to take up the offer. We were again hassled when going through the gate but with courtesy this time. The staff on the plane were all very professional and made the flight enjoyable both flying out and back again. On our journey home we downloaded our boarding passes electronically and it was much easier than printing it.
## 1524 Ryanair policies are terrible and staff rude. We had been backpacking for two weeks and were unable to print boarding passes. In Dublin, when I approached the desk to say that we had our boarding passes on a laptop, the customer service worker starting yelling at us. "How am I supposed to stamp your boarding pass if it's on a device?" So we got in another line and got our boarding passes printed but felt shaken that we'd just been screamed at (even though the 'save as pdf' option was clearly one of the options during online checkin and there was no warning about needing passes on paper). On the return from Edinburgh to Dublin, we still had not been able to print passes and were told it would be GBP15 per person to print the boarding cards. It was infuriating and felt like highway robbery. And then you get on board and they charge for the coffee and sell lotto tickets to benefit some children's charity.
## 1525 Very efficient service and great value for money. Both flights were on-time and the crew were friendly. Only the boarding process is a bit strange as you have to wait quite a long time standing in a line even before the aircraft has actually landed. This kind of boarding process makes their new priority boarding unnecessary. Overall I would recommend flying Ryanair.
## 1526 A means to an end to be honest. The furthest gate at ALC, but boarding was efficient, so was a mystery as to why we waited so long to depart. Seat was fairly comfortable, but anymore than a few hours would be the opposite effect. Still perplexed with the rationale of no magazine unless you ask for one (and its not common knowledge); as soon as the beverage service commences, its a guess as to what's on offer. Nice tea and generous with the milk at least. Cabin crew were friendly and approachable, and the Captain was informative. Flight was delayed by around thirty minutes, but at least it avoided the recorded fanfare on arrival.
## 1527 The ticket was cheap but not the cheapest. Long queue to check in luggage, thankfully we arrived 2hrs 30 mins early, had just enough time to drop luggage - which was literally that as already checked in online and downloaded boarding passes, find the gate and board. Told my 3 and6 yr old we would get a snack and drink onboard. Only problem was they had nO soft drinks or water for the girls and limited snacks. When we asked what we should give the girls to drink, the air steward advised red bull! Otherwise they had tomato juice! Apparently the inbound flight from Ibiza sold more than anticipated and they are not allowed to restock. I'm paying for it, it should be available and it's not like I was expecting it complimentary. I also found the staff rude and unwilling to assist.
## 1528 Flying with Ryanair, you get exactly what you pay for. The ticket was rather cheap, so the service they provide you is cheap as well. Although, that hasn't bothered me at all on this flight. The plane arrived on time and the crew were nice. The seats weren't very comfortable, but for me, that's not a problem on such a short flight. In short, flying Ryanair is Value For Money.
## 1529 Fantastic service provided for passengers requiring assistance : during online check in I was directed to the chatline concerning a booking for my mother aged 90 years and with severe sight impairment. The Ryanair agent could not have been more helpful and recommended lift on/off the plane as well as guided airport wheelchair which I requested. He changed seat reservations to more suitable seats and organised refund of seat reservation and priority boarding charges which I had already paid.
## 1530 This is the first and last time I would fly with Ryanair. We are a family of 4, I have a 9 year old daughter and 5 year old son. This airline expected my 5 year old to sit on his own at the front of the plane and my 9 year daughter to sit at the back. No one wanted to help or give me answer to the fact by law there not allowed to fly without a parent but yet you feel it's ok to separate my children from their mother. In the end a passenger actually moved so I could sit with my young children, if he hadn't my daughter would have been made to sit in the corner with 2 men who actually got really drunk and had to be spoken to on several occasions. I was told it's all to do with balance I've never heard anything so ridiculous. On the return flight we had to pay an additional amount to insure the safety of my children, I think this is a disgrace, we paid for our flights and shouldn't have to pay more. It's common sense to put young children with their parents.
## 1531 With Ryanair you have to be 100% clear of the terms and conditions, read and understand all the small print. They will come down like tons of brick on you if you make any little mistake. My partner and I were compelled to pay staggering \302\243120 extra on top of the fare. The reason? We didn't print our ticket 2 hours prior to boarding. It is like they playing cat and mouse with their passengers. Since the experience I have been flying with Norwegian.
## 1532 Both flights were on time. The plane was only half full. The crew on both legs were friendly and helpful. Ryanair hand luggage allowance is generous - sufficient for long weekend away. The food/drinks are quite pricy. I would fly with them again.
## 1533 No Complaints. Flew EMA to Chania return in May and July of this year. May was our first experience of Ryanair and we were pleasantly surprised. No complaints whatsoever. Flights on time, aircraft clean, friendly crew, got us from A to B at a great price. We followed all the "rules" chose priority boarding and have no complaints whatsoever.
## 1534 First time on FR in 6 years, as FR only option non stop MAN-STR. FR do ssem to be trying to improve both their onboard image and website functionality. Booking process easier, booked seats on return but not outbound as limited online access travelling on alpine holiday. Booked 1 hold bag and away we went. Check in easy at MAN, no hassles over cabin bag sizes and the hassles and stress seemed more passenger driven than airline provoked. Didn't join the queue 60 minutes early at the gate, not only were we assigned seats together, we also got overhead room easily as well. Flights a bit late but that's European air travel. Crew fine and we were in the STR rental car building in 25 minutes on arrival. On return STR didn't inspire with cold war security and check-in chaos but FR honoured our seats and we strolled on 10 minutes before departure. Nice coffee and informative FO pointed out sights. FR seemed to have toned down the sales pitch and we would try them again.
## 1535 Everything went smoothly, from check in to the flight itself. I'm just over 6ft, legroom was not massive but easily adaquate space for a comfortable flight. I never really encountered the staff on the plane but they seemed willing to help customers.
## 1536 I wish they would fly more of my routes. \302\24325 Manchester to Stuttgart - how can you not love this airline? The train to and from the airport is often more expensive. Hand baggage allowance is now very generous and leg room is much the same as you would get in any economy class seat. You might get asked to put it in the hold if its a very busy flight but I don't see how this is a problem. This has happened to me more than once and the staff were very good about it. Aircraft modern and staff are efficient. They know how to get you from A to B as quick as possible and they get the job done well indeed.
## 1537 I have flown Ryanair before and knew what to expect, however they seem to have undergone a change. Gone are the hard sell, pay for everything tactics, which have been replaced by a soft sell approach which seems to be working. The flight was uneventful, and pleasant, like always a 20 minute early arrival at Stansted meant we missed the wait at passport control and baggage reclaim. I was out of the airport within 20 minutes of landing.
## 1538 Even, despite following all the rules, the air stewards insisted on putting our hand baggage in the hold, 'the flight is busy' was their excuse. Arrived in Palma and waited for ages to get our cabin baggage from the aircraft hold. The return flight was a bigger nightmare. Again rude cabin crew and the flight was delayed for around 1.5 hrs whilst seated inside the plane. Drinks were offered as it was quite stuffy and to the amazement of passengers, they were charging for this. The captain announced that we would be taxiing in 8 minutes and to go to the lavatories if one needs to. I went to the loo and was told to get back to my seat by a rude air hostess. I decided to order some food and the same surly air hostess unfortunately took my order. I know the airline is cheap but we are paying customers and deserve to be treated humanely.
## 1539 Booked very late so paid a fortune but I had to travel. Other than this everything was good. Easy purchase and online check-in, boarding fine though a long wait in the warm sun which would have been grim in rain and cold. Flight on time, great UK flight deck and Italian cabin crew. Seats and legroom are ok for a 2.5 hour flight. Coffee pretty good. Arrived 20 mins early.
## 1540 When I arrived at the airport I got into the check-in line although I had my printed boarding pass. Seeing other passengers approach a separate window that appeared to be there to sell tickets or collect overcharges, I approached, showed my passport and boarding pass and asked if I needed to remain in the check in queue. That is when she told me that because the flight was full, I would be allowed to check in my one rolling bag free of charge. After security, boarding of the flight was impressive in terms of smoothness and professionalism. There were two lines: priority for those who prepaid their seat and general for those who chose not to spend a few extra euros for excellent service and benefits. The priority line has seats for passengers but the general boarding did not. I was the first to board. I quickly found my aisle exit row seat and sat. The flight attendant walked by and asked that I store the hand bag I had with me in the overhead as it was an exit row. Priority boarding was relaxed and more civilized. Print boarding pass before you get to the airport. If you printed your boarding pass, you can go directly to the gate. I was able to check in my rolling bag for free because the flight was nearly full and there was need for overhead space. Weigh your hand luggae and ensure it is within the rules. Spend the money and reserve a priority seat. It makes a huge difference.
## 1541 Second round trip with Ryanair this year and all went fairly smoothly. Had booked early for a good price and managed to check in for return flight at home before leaving for Liverpool airport early in the morning, so avoided any extra charges. Did have a 30 minutes delay on the outward journey which was attributed to Belgian ATC because of the "very busy skies over Europe this morning", but since boarding (for an early morning flight) did not start till about 20 minutes before scheduled departure time I suspect we simply missed our designated slot. Also there was a puzzling request from the cabin manager that passengers should make sure they sat in their allocated seats because of the carefully arranged weight distribution. Given that the plane was completely full, how and where was weight distribution arranged? Plenty of sales pitches on both legs, but my impression was that many of the passengers just switched off and sales were actually fewer than on flights I've had with easyJet. None of the past quibbling over cabin baggage and even on the full outward flight everyone seemed to get their bags stowed in the lockers with crew members' assistance. Ryanair certainly seems to be more passenger-friendly these days but it is still advisable to be aware of the rules to avoid any possible pitfalls.
## 1542 Terrible experience by check-in. In both flights we had to wait more than 1 hour because all passengers who came too late for other flights had priority. Very unfriendly staff, especially in Brussels (Zaventem). Passengers are humiliated by the staff and bad organisation of Ryanair. The ticket was not cheap at all!
## 1543 I have previously travelled with Ryanair many years ago and always hated the experience. However, recently decided to give it a shot as they fly direct to Marrakech. I was impressed with their website and ease of use. I managed to prebook seats, luggage, check in online etc. It's a no frills airline but you are paying such great prices so you cannot complain. The cabin crew were friendly and did a good job on board. The only negative comment I can say is that they had ran out of Prosecco (except for 1 bottle) on both flights and we were sitting in Row 3! The bar seemed poorly stocked and on the return flight I heard that there was no hot food available. I am not surprised as the passengers were only getting off our aircraft 5 minutes before we boarded it to return home. I never saw an aircraft turned around so quickly in all my years of travel. A big plus was no lost baggage and everything arrived home in one piece, including delicate pottery souvenirs etc.
## 1544 Ryanair chartered an Air Explore aircraft for both flights and on both legs we were on a filthy aircraft. The overhead lockers were caked in dust and chewing gum stuck to the seats. The cabin crew were pleasant enough, however we did not hear a peep out of the flight deck - a welcome would have been good customer service.
## 1545 No frills airline so did not expect free food/entertainment, beverage service fast and ok. Seats width ok but not enough legroom for me (191 cm tall), also backrests not adjustable but was a short flight. Very smooth check-in at FMM (4 counters open), fast boarding.
## 1546 Arrived two hours before flight. Hundreds of people fighting to check bags, took over one hour and twenty five minutes to get to check bags. They kept putting people in front of us who had arrived late. After check in we had to fight and push our way through a grid lock for security , then ran like mad people through the crowd just making the aircraft before gates closed. I have never experienced anything lie it before. After paying for baggage, I think British Airways would have been cheaper, considering had to make our way to and from Stanstead as well.
## 1547 I don't see why people complain about the airline so much! I've flown with them for the last 8 years with no issues whatsoever! I fly with them every year as they are the only UK based carrier that takes me to where I need without a long car trip afterwards! Ok, so the interior is yellow and blue, but what do I expect for a cheap ticket? The crew aren't bad, they do what they need and usually with a smile, I have never had a problem.
## 1548 I'm starting to fly this route more regularly, and for the first time have to report what I consider to be a significant failing with the cabin crew. Our plane (FR7974) left late (after a late inbound arrival). I was sitting in Row 2. There was a minimal announcement from the flight deck naming the crew but nothing to invite the passengers to listen attentively to the safety briefing, which is often the final point made during the cockpit pre-flight passenger announcement. The announcement was very quiet and the delivery was monotone. I appreciate that the flight deck crew wanted to get a slot and head back to London as quickly as possible so their priorities might be elsewhere. The pasenger safety briefing was voiced by the female cabin crew member but it was impossible to hear (even in row 2). Even the young man doing the demonstration seemed frustrated by the lack of interest being shown. When I asked the female cabin crew why she had not stopped the briefing and reminded the passengers to pay attention, she told me it was not really worth it, because 'they (the passengers) wouldn't do it and anyway they fly so regularly that they don't need to listen to it because they know what to do by now'. The drinks run and duty free run were very speedy, leading to the crew spending around 10 mins in the forward galley area spilling out into the aisle in full sight of the passengers each with a mobile phone in their hand and chatting. Apart from the young man cabin crew at the front who made a personal, animated and delightful appeal for the scratch card run, and whose cabin service was friendly and most welcome, this cabin crew seemed to be the most uninterested and switched off that I have travelled with in over 15 years of travelling with Ryanair. Very disappointing.
## 1549 I have flown with Ryanair for the last 10 years because they are cheap and relatively reliable (I think I can count the numbers of times my flights with Ryanair have been delayed on one hand). Billund to Venice went smoothly. I regard Ryanair as a very good airline if you only want to get from A-B fast, are not interested in the flight service and food and that you remember to stay clear of any overweight luggage. Lately I have noticed that they do not weigh the hand luggage anymore and are fair with the weight.
## 1550 This was our first experience with Ryanair. When booking the flights, we were impressed with the low fares. We did print our boarding passes to avoid fees at the airport but missed that you have to pay for baggage online. With the fees at the airport, the suitcases cost us double the fare for us to fly. It would have been cheaper to book seats for our suitcases!
## 1551 Our return flight was cancelled with next available a week later, no one from Ryanair at airport to help. They offered to put us up for one night only, helpline told us we had to sort out alternative flight ourselves - we are currently stuck in Italy. Ryanair do not care should be their slogan. We are having to take 5 hr train to Rome to fly with easyjet at our own expense to Leeds then try to get to Manchester to pick up car if it hasn't been clamped for overstaying on car park. Would never use again.
## 1552 I'm very satisfied with the service on board. We flew as a family. Both flights to Tenerife and Warszawa were on time. The food isn't cheap but worth it. Some people say that the seats are uncomfortable or there is not enough space, but found them perfectly adequate. The aircraft was in excellent condition. I will fly with Ryanair again.
## 1553 Flight on time, seats comfortable enough for a low cost airline, friendly and efficient staff.
## 1554 Shambles at check in even though we checked in online, late boarding and then sat on the tarmac for almost 2 hours. The flight attendants were not even going to allow you to get off your seat or go to the toilet. Very warm in the plane and virtually no info from attendants, if possible will never fly with Ryanair again.
## 1555 11th and 12th July, HHN-STN-HHN. Both flights were on time. Same cabin crews by chance and they helped passengers to find luggage spaces on boarding. At STN, you can get a visa check stamp at "Flight closing desk" without queue if you don't have a check-in bags. Just follow rules and arrive at the airport early enough.
## 1556 Through Stansted airport and Ryanair we nearly missed our flight, we had booked our seats and paid for priority boarding, but we had a 2 lane traffic jam trying to get dropped off, then baggage drop there were so many people we only managed to get through with 3 minutes to spare before closure, then through security and 10 minute walk to departure gate. Waste of money for priority boarding they had already gone, we had arrived 2 hours before take off but obviously this is not enough. Flight was good once we got on, but a very stressful experience.
## 1557 Ryanair mobile app is rubbish. Even if you check in using the app, it doesn't mean you have already checked in, you need to check in on their website. Their customer service is the worst I've ever seen. I purchased luggage the day before I depart using their app and when it's time, they said they did not receive the payment so I need to make direct payment in the airport. Yet, they charged me twice for using the app and direct payment. I've been sending email and they do not even want to reply me.
## 1558 Booked early and paid $11.95 each for 6 of us to fly Pisa-Hahn. Pre-paid the bags, checked in online and printed the boarding passes before hand. My first Ryanair experience as we are Canadians, and it was fantastic! All staff were pleasant, procedures were efficient couldn't have gone smoother. Flight itself was better than expected, clean, comfortable, safe, and on time. I'm 5'9, my son is 6'1 and we had enough legroom. Flying with them again in a week.
## 1559 As a frequent flyer this was one of the worse airlines I have traveled with. Cheap tickets that add up quickly with luggage etc.. Their customer service is hard to get a hold of, no one in the airport until 2 hours before the flight. Also once you find them it is almost comical how bad their customer service is. I asked police at the airport about how long the security lines are since I found out I was not getting checked in until 2 hours before and they were puzzled because other airlines usually do it 3 hours before and they asked which airline and once I said Ryanair they smiled and said "of course."
## 1560 Bought their highly advertised Biz+ ticket. Complete disappointment. Dumped in the last rows as promised seat was not given - waste of money.
## 1561 When we arrived (4 passengers) and waited 40 minutes to check bags, we were told that we only arranged for two bags and would have to pay for two bags. But because agent could not take payment, we needed to go to customer service to pay. She filled out a form and told us to pay and return to front of line and they would held the plane. We still had over 1.5 hours. So, we waited in line at customer service for almost an hour and was told that we owed them \302\24320 for 2 Kilos. I informed her that it was 2 bags not 2 kilos. so, we were sent back to the baggage line to get the correct form. We went to front of line as instructed and crowd was unhappy. Our agent had left. But, we got the correct form and returned to front of customer service line, crowd was unhappy, and was told that it would be \302\243400, that is almost $800 US dollars for 2 bags. We tried to sort that out but to no avail. We were told to read the small print over and over. So, I agreed to pay and was told it was too late, that the flight was closed. So, we had to buy new tickets on another airline at another airport. They sell you tickets at a low price and then through small print charge you for seat, printing boarding passes, extra baggage etc.
## 1562 Our recent experience with Ryanair was unsatisfactory thus we cannot recommend this airline to anyone. We chose Ryanair for its low fares. The numerous fees exceeded the original cost of our tickets. While some fees are warranted, Ryanair is the only airline I have flown that charges fees to print out boarding passes. Their excess baggage weight fees are higher as well. Even more troubling is the disorganized check in and bag drop-off process and unacceptable customer service. We had to stand in one long line to drop off checked bags, another line to pay extra fees and return to the 1st line to complete the bag drop process. During this ordeal, we were met with staff who were insolent (berating us in French) and clearly had no allegiance to Ryanair (giving confusing directions). Ryanair has a lot to learn about efficiency and customer service if it wants to be the Southwest Airlines of Europe. Until then, we will fly other airlines, even if the fares are higher.
## 1563 I flew out to ibiza with my husband and 2 small children for a family holiday and our flight out was terrible. I understand that a lot of people go to Ibiza to party but so do a lot travel for family holidays - it was like a party plane. There was no control of the travellers who congregated in the aisles, sat 4 to a row (3 seats) sat on arm rests, music played loudly in the row in front of us (and not good music at that). The trolley of drinks and snacks was pointless on both the flight there and back as after a few rows there was nothing left (we were in row 14) the seatbelt light was put on half way through our flight out there when there was no turbulence - I believe this was to try and seat people but when my husband attempted to take my 5 year old daughter to the toilet (whilst others were still stood I have to add) a member of staff was slightly rude and told us she couldn't go and had to sit down. Shortly after this the light was turned off. I have flown with Ryanair before and not had this problem but I would definitely consider not flying them with my children.
## 1564 My daughters and I were due to fly to Morocco on Sunday morning at 6am. On Saturday at midnight we realised that one ticket had the married name but passport was in maiden name. We got to airport and were first in queue for customer services, saw staff who after a bit of persuasion changed the ticket name free of charge! We cannot thank her enough for doing this and enabling us all to have the best family celebration ever. Again thank you.
## 1565 Flying back from Malta to Bristol we had to check in 2 hrs before flight to print boarding passes. Explained we were not able to get online. Got to airport with time to spare, asked for assistance, Maltese staff very helpful and they tried for 30 min to get online. When they finally got on to site to check us in we were 10 min late. We got to the Ryanair desk where basically if we didn't pay 45 euros each we could not fly. Hence we paid 90 euros to print two shabby bits of paper, got to check in desk, told we had to sit separately as there were no seats left as we checked in late? Still nearly 2 hrs before flight? Got onboard and my husband had 3 seats to himself and I was 2 rows in front. 90 euros because we were 10 min late through no fault of ours.
## 1566 We flew a one-way flight from London Gatwick to Cork in late May. We'd never been to London Gatwick airport, but it was a fairly pleasant experience. It was odd that the airport did not announce departure gate numbers until an hour beforehand, but it wasn't a big deal. I personally enjoyed doing some shopping and getting a bit to eat before heading to the gate. The boarding was fairly effortless, although Ryanair did not call us by seat number. This resulted in a big bulge of customers at the start of boarding, so we just sat back down and waited. The flight was on-time, We had a pleasant, short flight to Cork. Cork Airport was beautiful and it didn't look like there were many flights arriving that time - our visit through customs was brief and very friendly. It was a pleasant trip and a very inexpensive one too. Our family will definitely fly with Ryanair again!
## 1567 Cheap but problem on that route. Apparently Ryanair is having a labor dispute with it's baggage handlers at MAD airport. Consequently no baggage was carried on that route and I was not informed until 2 days before the flight. I was already in Europe and my bag was too large to fit in an overhead luggage compartment. I had to privately ship my bag to MAD at a much greater cost and received only the baggage charge refund. Ryanair is not a customer friendly airline. If anything goes wrong you are left to your own devices to find a solution.
## 1568 Not as good as other airlines, but I guess you get what you pay for. You don't expect much from a flight with low prices. Staff seem disinterested and lack enthusiasm for their job. Inflight food is extortionate and not worth the money. Beware that unless you are in the first half of passengers at the gate then you are unlikely to be able to take your cabin baggage onboard with you and will have to put it in the hold.
## 1569 Experience was poor. We booked with Ryanair after a long time of not using them after previous bad experiences but saw the new website and various other newly replaced items and services that Ryanair use and bought tickets for return flights to Tenerife. However easier the prepayment section of the booking experience and website may be we found that once you had played the airline used all sorts of dirty tricks such as making you pay for allocated seating if you wanted to make sure your party was sitting together and charging for all sorts of other service that would be expected to be provided freely. This made the flights no cheaper than the ones that other airlines offered. The cabin - despite pictures on the internet - looked gloomy, old fashioned and dirty. Onboard food as overpriced and service was slow. The cabin crew were constantly pushing you to buy products as they are partially payed on commission. Also the main reason Ryanair is usually on time is that unlike other airlines they add an additional 10 minutes onto the actual estimated flight time.
## 1570 Dropped my bag off at the dedicated Ryanair Terminal E at Bremen. Boarding was slightly chaotic due to simultaneous departing flights to the UK, but this was not Ryanair's issue, being within the control of the airport authorities. The cabin crew were very welcoming, especially the cabin supervisor. She appeared efficient and along with the rest of the crew seemed to go out of her way to chat to as many passengers as possible when the opportunity arose. The crew were humorous in their charity scratchcard sales pitch and the flight arrived in Edinburgh around 15 minutes ahead of schedule. Very good value for money and a useful route between Scotland and this part of northern Germany. Would definitely use again.
## 1571 The good. \302\243200 for 2 return flights in June represents excellent value for money. Both flights were more or less on time, and the outward boarding was quite smooth. The bad. On the outward flight awful overpriced food was offered and there were 2 \342\200\230scratch card runs \342\200\230. On a two and a half hour flight? There being no on board magazine or duty free menu is it any wonder nobody buys any duty free goods \342\200\223 nobody has any idea what is for sale. At the end of the flight there was no thanks or goodbye as we left the plane the first time in 35 years I have ever had this. The two cabin crew by the rear doors totally ignored the departing passengers whilst chatting in their own language. Very unprofessional cabin crew that day. On the journey back the cabin crew were much better. There was only one scratchcard run and one hard sell on the breakfast lasagne that \342\200\230melted in your mouth \342\200\230. No thanks. Our real issue as we were waiting in the queue (towards the back) to embark a ground staff came up the line and attached yellow stickers to our hand luggage and boarding pass. She spoke no English, and we eventually worked out our hand luggage (which was all we had by choice) was now going in the hold. This was a bit of a disaster for us as we were now being forced to wait at the baggage reclaim at the other end , a wait which proved to be about half an hour meaning we overshot out car parking time and had to pay excess. Despite this sticker business some people behind us in the queue were removing the stickers prior to embarking and just taking the luggage on the plane anyway. But we played the game and tried to safeguard some delicate stuff we had. Despite this on arrival home we found that some articles were damaged, something that should never have happened in the first place. So, in a nutshell if you are prepared to forsake everything for a cheap flight Ryanair are the best in the business. If the travelling is a big part of your trip, avoid them like the plague. We will be in future and have decided never again. There are deals out there on decent airlines.
## 1572 Quite nice experience and on-time flight. The crew was friendly but the seats not that comfortable as I wanted.
## 1573 This flight was a prime example of how a good crew make all the difference. Some girlfriends and I were on our way to a birthday weekend getaway. The BRU based crew were fabulous, joking with us and even announced the birthday over the speakers. I have never been a fan of Ryanair but maybe changes are happening. Although ground crew was shouting at a pax at boarding so maybe some tweaking needed yet!
## 1574 We were very pleased with all aspects of our Ryanair experience both to and from East Midlands Airport and Barcelona Airport last week. The booking, reminders and boarding passes were easily accessed. The staff on the ground and inflight were very efficient and hard working, friendly and pleasant at all times. People had said that due to previous reports about Ryanair, stopped them from flying with the company. We found these comments untrue, and will certainly use Ryanair again. Perhaps, if passengers were to read the full details, instead of assuming, they would have a better view.
## 1575 2nd June Flight from Bergamo to East Midlands. Whilst in the queue to board a member of staff tagged my hand luggage and boarding pass with yellow stickers. I was just over half way down the queue. All the people around me were being tagged so thought nothing of it. On boarding I moved to my seat half way along the plane. A member of\nthe crew who was stood near to my seat told me my bag should've been left at the entrance and put in the hold. I had at no point before this been told to do so. The aisle was rammed with passengers but she still wanted me to take my bag off the plane. After much discussion I persuaded her to let me put my bag in the overhead where there was plenty of space and I would remove it if necessary. I sat and watched many more passengers board who had arrived much later than me (no stickers on their bags) as it happened there was plenty of space in the lockers so my bag stayed put. I had booked hand luggage only as I needed to be out of the airport quickly. My bag was not oversized and I was nowhere near the back of the queue for boarding. I am not happy that I was made to feel so uncomfortable in front of other passengers.
## 1576 Glasgow to Bydgoszcz on Friday 5th June. Well this was supposed to be the date at 4.30pm. This was then delayed an hour. So it gets to 5.30pm and off I go to board, all good lets us board the plane. Once everyone is on they then announce there is a technical issue and leave us on a hot plane for 1.5 hrs. They then tell us the flight is\ncancelled and we need to disembark. Arrange another flight for us at 8.45pm. So we are waiting around for hours with a \302\2433.50 voucher provided for food and drink. Anyone that knows airports knows that this would get you a bottle of water if your lucky! So take 2 go to board for the 8.45pm flight, get to the gate and even though the\nplane is there they tell us we are not going and no explanation as to why. We then have to go and collect any luggage and when I ask if there is any news get rudely told to go "stand over there!" Finally they arrange to get us taxi's to a local hotel. Well 6 taxi's for a whole flight took quite a lot of time. It's midnight by the time I get there and the front desk tell us we need to be ready for 5am. So get to the airport for 5am, the flight is then put back an hour. Finally time to board and not a member of staff in sight, they finally arrive at 8.30 and start to board us. Once everyone is on board we then have to sit there to wait for "paperwork" and then another passenger. Finally we leave after 9.30am but are then told there are no drinks or food on board. Now these things happen when flying but it was the total lack of care or empathy from the staff and the lack of communication that was the absolute worst. I for one will never fly with Ryanair again, this was the first and last time!
## 1577 Flew from Warsaw Modlin to London Stansted. Going back to Warsaw tried to reach Stansted by train operated by Stansted Express. They experienced some problems on that day (6th June) and had delays of up to 120 mins. Managed to get to Stansted one hour before flight, but stuck with security check finally missed the flight. In fact we\nwere at the gate 10 minutes before planned start time. I was accompanied by a group of 10 people at the same situation. Gate was already closed and Ryanair clerk informed us that they cannot risk any delays for those who are late. So far so good, best came at their so called "Customer service" point where pleasant clerk advised me to take Taxi and not to take train next time. Thank you Ryan for that piece of really valuable advise. Next time I am not going to take Ryanair in the first place. You ask about Food and Beverages, they are excellent as long as you buy them at the airport and take with you on board. Similar with Inflight Entertainment unless you treat selling some lottery tickets as entertaining activity, the entertainment is going to be great onboard provided that you prepared something yourself for the trip.
## 1578 Went STN-DUB-STN with both flights not having any incidents although my inbound flight was delayed in a very inconveniencing way. I had heard carriers like this tend to have delays on evening flights but I thought it might be worth at least one try - big mistake! The flight landed so late I missed the last train back to my house,\nwhich meant I had to take a bus and add about an hour to my already very late (past midnight) trip home. On my outbound flight the staff also seemed very confused when I asked for an Irish immigration form, as when I got to the airport it turned out I did not need one, and it might have been nice for the attendants to know this type of information for an international flight.
## 1579 Went STN-CHP-STN, with no real incidents on either flight although they both left late. On the way back the attendants 'just happened' to have a UK immigration form as I'm not from the EU so for a bit I thought there might have been a problem. Coming back they even let me check in my hand luggage which actually made things a bit\neasier which was nice.
## 1580 FR2005, Stansted to Otopeni, Romania. This was our first flight with Ryanair and we approached it with a degree of caution and apprehension. I have to say, that these feelings were unfounded. Ryanair in 2015, simply do not deserve the reputation they have. The entire booking process was easy to understand and administer. Follow the rules and it works well and easy. The flight itself was bang on time, smooth and a joy. A few of our fellow passengers were an issue, with what we understood to be their pre-emptively abrupt attitude with staff which was mildly unpleasant and entirely unnecessary but perhaps a hangover of Ryanair of old. I think that all Ryanair need to do now to complete their transformation to a customer friendly carrier, is make water affordable on board. Perhaps \302\2431 for a 500ml bottle of water wouldn't be too much to ask?
## 1581 Flew with Ryanair for the first time from Alicante to Manchester. I had not printed off my boarding passes for the three of us. I was not able to do this where we were staying. They then wanted 45 euros from each off us to do this. I managed to get to a PC at the airport and do it myself. The queues for check in were like Russian Bread Queues from the 1970's. When we eventually go to the front the check in clerk next to our queue (without any notice) closed his queue and then his queue tried to push into ours. It was appalling and could have escalated into something nasty all due to the bad customer service from Ryanair. I also witnessed an elderly disabled passenger become very distressed when she learned she could not take her collapsible walking aid onto the plane even though she'd been told in advance that she could. She became very distressed as she could not walk without it and was not offered a wheelchair. Absolutely appalling treatment. I will never fly with them again terrible customer service.
## 1582 May 14 FR1199 Athens to Rome. We will never fly Ryanair again. The terminals for checking baggage did not work. The staff at the Athens airport was not helpful to us or from what I could see any one else. This is not a low cost airline for travelers with luggage (you will pay about 45 euro per bag) and not good for travelers without access to printers (15 euro per non-printed boarding pass). Also charge if you don't check in before arriving at airport but I had done that so I'm not sure of the charge. Printers did not work at airport.
## 1583 The flights between Madrid and Manchester are arriving systematically with a significant delay. The arrival in Manchester which was scheduled before Eastern at 11pm was rescheduled to 11.30pm. Nevertheless the flight arrives at least one hour later most of the time. One time the flight arrived so late that the officers at the passport control were gone. The last time that I took that flight Mon. June 1st it arrived at 1am. These times really disrupt the life of anybody who has to work the next morning. There is no explanation given. My guess is that Ryanair has multiplied the number of flights but it is the same number of planes.
## 1584 FR2447M 29th May. Returned last night from Malaga check in fine but once on board was informed that they had no water and no soft drinks I was offered a vodka or gin but no mixer. I would have thought from a health issue they should at least have restocked with water.
## 1585 26/5/15 Brussels to Barcelona. They changed our flight well in advance but also far too late to change all the arrangements made for this holiday cutting our 1 full day two half day vacation (the only one we're having this year) back to 1 full day and 1 half day. Inflight there is no time to relax as there is a continuous stream of announcements for beverages discounted fragrances food items lottery tickets city maps discounted tickets for sightseeing etc.. The transfer we booked through them raised our stress levels as well they were not where they were supposed to be there was no transfer within 30 minutes as printed on the ticket and the lady kept saying 20 more minutes because of traffic but in the end it took them no less then 2 hours!
## 1586 I opted for Ryanair due to needing a direct flight from Gdansk to London. I read all the small print and rules to be able to pay the correct price for bag fast boarding and emergency row seat. These extras added up to about 100% to the initial price tag but even then it was quite cheap (some 70USD one-way all inclusive). There was no trouble with booking as well as with online check in. I was even able to download mobile boarding pass through the app. At the airport I only spent abut 10 minutes for bag check and visa verification. At the gate my experience was not overly pleasant with some 200 people with screaming children left on the stairs leading to the apron for about 20 minutes. Then door opened and crowd went to the plane. Since I booked priority boarding I had no trouble reaching my seat and accommodating my bag. The crew were polite and helpful. Since their hand baggage limit is strict there was no problem finding space for bags. We took off on time. The inflight experience was up to expectations but not as annoying as some wrote here. No seat recline but plenty of legroom in emergency row. The plane was very tatty but clean. Toilet was ok. We landed 10 mins ahead of schedule. Then usual labyrinth of Stansted terminal and unbelievable immigration lines for EU citizens. Due to being Ukraine national I was directed to the non-EU line which consisted of some 15-20 people so it took me 10 minutes to pass border control. My bag was already on the belt I was off the airport 20 minutes after landing. Absolutely bearable experience; you'll have no trouble if you carefully read their instruction and spend extra 10 minutes on booking process. Also expect to pay twice of announced lowest price online to avoid airport charges.
## 1587 FR8524 STN-SXF 9 May operated on behalf of Ryanair by Air Explore using Air Explore's own but similar 737 equipment. Being a Ryanair (cheap) flight cant expect much. But compared to normal Ryanair planes the seats could recline. However no safety cards in each seat and few Ryanair magazines (all in tattered condition) - not that I wanted to order any food or drink on this short flight of 2 hours. Plane was not very clean - but few planes (both budget or full-service airlines) are really clean nowadays. One flight attendant was particularly nasty I took a photo of the cabin and she happened to be in the photo she stormed straight to me and shouted at me to delete the photo immediately. Terribly rude! Otherwise flight was uneventful departing and arriving on time.
## 1588 EDI-BTS on 17 May. I've opted to avoid Ryanair for the last five years preferring to travel on full-service airlines from central airports for a little more money. However in this instance Ryanair offered the easiest best times connection from Edinburgh to Vienna (well Bratislava). I paid \302\2438 for seat 1C (extra leg room and priority boarding) and \302\24315 to check in a bag online the day before departure. Bag drop at Edinburgh was efficient. On time departure friendly staff quick flight early arrival can't complain. Apart from the lousy dry cheese sandwiches and drinks you get on Lufthansa/Austrian the difference was minimal. So well done Ryanair.
## 1589 Flight FR9810 from London Stansted to Barcelona El Prat T2 on Monday 4th May 2015 scheduled to leave at 08.15 However due to Barcelona being fog bound they had delayed all flights into Barcelona apparently from many UK airports. We were firstly informed that a delay of 1.5 hours was estimated. After a while we were informed that another 1 hour had been added. So all passengers sat on the plane for 2.5 hours. Our first complaint - Sitting in a stationary hot metal tube for 2.5 hours is not my idea of enjoyment particularly when nobody was offered even the smallest drink of complimentary cold water in order to alleviate the discomfort. During the 2.5 hour delay there would have been time to have some water delivered. The irony in all of this is that shortly after take-off the cabin crew came round selling drinks. Our second complaint - Flight FR9015 Thursday 7th May - El Prat to Stansted. Taking advantage of the 10kg on board baggage allowance + small bag we purchased a second "carry on" cabin bag (size within stipulated regulation). On the outward journey not a problem. A different story on the return flight though. On entry to the plane I was told by a Stewardess "That is not a cabin bag!" I explained that we had no problems on the outward journey the cabin crew were quite happy. Not being convinced she repeated the statement "That is not a cabin bag!" I again repeated my statement and then went to take my seat and stow my cabin bag. Little knowing that my wife was behind me she said again in a rather snide voice "That is not a cabin bag!" Not wanting to cause an argument my wife just reiterated the fact that it was acceptable on the outward journey. So in summation we have a rather dim view of Ryanair. Booking of future holidays will take into consideration who the airline carrier is and if it is Ryanair we will attempt to make alternative arrangements.
## 1590 Quick trip to Madrid and back by Ryanair operated by Smart Lynx. Busy flight boarded last and at ease and no one stopped to pay luggage fees. Delayed departure (from ATC) bit soon up and away. Quick service by professional and friendly crew. Updated a few times by flight deck on movements. All in all a good trip excellent fare and more than satisfied.
## 1591 FR9823 I traveled from Bratislava to Rome back in April I must say we were satisfied with Ryanair the aircraft was modern and clean staff smiled and were helpful. We arrived on time we had our boarding passes ready we took our seats the flight was good no turbulence. Captain provided updates to passengers multiple times during our short flight. I don't understand previous complaints about printing boarding passes. This is their policy it is clearly stipulated on their web. they have good prices one just need to follow their terms and conditions. As a reward you will get cheap flight tickets very simple. Also you can have two cabin bags with you for free. Just be sure they fit the cabin bag dimensions. Italian crew checked all the passengers cabin bags this never happened to me in England or Slovakia.
## 1592 FR2282 WMI-STN 26th May. Warsaw Modlin airport gate area far too small not enough seats and chaos. Priority boarding queue sort of worked but not as smooth as it should be. Seat 1A excellent and first off on arrival. Aircraft departed late and never made up the time so we were just over thirty minutes late into STN. Information excellent though as to delay from flight crew and delay not that bad. Cabin crew OK and for price paid flight was very good.
## 1593 Return flight from Valencia to Bari last week and have no complaints at all. The flights were both on time. The staff were pleasant and professional. An excellent direct service for 75 euros return.
## 1594 FR1021 STN-WMI 25th May. Priority boarding ran smooth had seat 1A which had plenty of legroom and it meant I was first off the plane at the destination. Had breakfast in the airport so didn't purchase anything on board. Flight departed on time and arrived in Warsaw early. For the price couldn't fault it.
## 1595 I travel frequently with Ryanair mostly because its destinations and schedules are convenient. The airport teams are efficient to the point of being distant/abrupt while the flight teams are busying and friendly. Altogether I find Ryanair best of the low-budgets. However its constant and repetitious announcements inflight could really improve. On Stansted-Karlsruhe there were 11 announcements before take-off and 11 during the one-hour flight (22 announcements within 75 mins!). The content covered safety refreshments and fund-raising. On 5 of these occasions when the announcement was the first time announced it began "Once again...." on 7 occasions the completely unnecessary request was to "sit back relax and enjoy the flight". Am I the only person who finds this really irritating?
## 1596 First time with Ryanair flying Stansted to Prague. Good price more competitively priced now than Easyjet hence deciding to travel with them instead. Flight left a little late but made up for the delay in the air and landed on time. Cabin basic and not particularly clean- we literally passed the departing passengers from our plane across the tarmac so obviously no time there to clean the plane - however if speedy turnaround keeps costs down I can put up with a few crumbs. Did not pay for allocated seating but got two decent seats one by the window. If they reduced allocated seating costs I might have considered it. Return flight also bang on time leaving and arrived early. Pilots friendly and informative although very difficult to hear as engines seemed much noisier than other airlines. Staff were definitely not as friendly as other airlines rolling eyes at passengers etc which is a shame as being cheap shouldn't mean poorer customer service. I am meticulous about measuring hand luggage as I do not want to be charged extra but the shapes and sizes of bags being allowed on was hilarious- some people looked like they'd packed for a 3 week cruise. Everything was allowed on and massive bags which would never have fitted in the cabin were allowed in the hold free of charge. Overhead lockers were completely crammed with massive hand luggage items. All in all does what it says on the tin - got us there and back alive and well on time at a good price.
## 1597 I booked a fairly priced return ticket between Dublin and Edinburgh in May 2015. The experience was horrible. I think the check-in and baggage drop works okay as long as you only have hand luggage and a European or UK passport. If you need to check in a bag or you require a visa it's absolute chaos. There is no clear signage the staff keeps directing you to a different queue that already has at least 50 people waiting. This was the closest I've ever come to missing a flight. The price of my ticket increased threefold with the bag I checked in (less than 20kg btw) and they even charge 15 euro to print your boarding pass. This borders on criminal if you ask me. I will never ever fly with Ryanair again and I will go out of my way to let people know how bad the service is.
## 1598 16th April Stansted to Otopeni FR1005. I flew from Stansted to Bucharest. Filthy seats cabin crew that gave the safety instruction only in English despite the fact that the flight was to Bucharest behind me was a non English speakers couple which asked me to translate what the hostess said. Very disappointing!
## 1599 FR4774 May 14th and FR4775 May 18th. I have never been a fan of this airline but I have to admit they are moving forward and slowly getting closer to what I consider to be an enjoyable carrier to fly with (for short haul flights). Flew BGY to SKG last week for a short Greek holiday with no issue at all: on time departures/arrivals good rate for the ticket and above all some improvements I did notice compared to the last time I flew with them about 3 years ago. The main one is of course the seat allocation for everyone which prevent people from rushing to the aircraft as if it was a bus school trip. I also found seat comfort and legroom to have improved and even the cabin crew seems a bit more professional and friendly now even if they still talk too much in my opinion during the flight to try and sell whatever the can to the passengers. Another positive news is that there is no longer (at least according to my experience) an obsessive check of your hand baggage dimensions and weight at the gate which I do appreciate. Generally speaking if you check the rules carefully and comply with them you can get a great value for money as well as good and frequent direct connections. The day they stop boarding the plane half an hour before the plane is actually ready to welcome passengers onboard (thus causing people to wait on the stairs/bus/apron for up to 15 minutes) they will probably see me much more often on their planes.
## 1600 MAN-PMI-MAN. Usually fly with easyJet from Liverpool but Ryanair schedules appeared first and I found cheap flights for our preferred days. Had a later bonus in that our original outward flight in the evening was cancelled and we were transferred to the morning flight which had been dearer at the time of booking. I read all the rules carefully and intended to pay for seats so that we could print off our return boarding passes before we left home. I was subsequently shocked to find that even standard seats would cost \302\24310.99 per person per flight and this was not even high season. In the end I got up extra early on the morning of our outward journey and printed off the return passes at 02.15! It was noticeable that hardly any standard seats had been booked in advance: perhaps if the charge was less Ryanair would actually find more people choosing to pay. The flights themselves went off largely without incident. We were late departing from Manchester but then we did not start to board the plane until 15 minutes before official departure time yet this was early in the morning. I found it difficult to hear any of the announcements partly because of the noise of the engines and passengers talking loudly to compensate but also because of the gabbled way in which they were delivered. The return crew were much better in this respect despite the senior steward looking to be all of 14 years of age. Not much attention seemed to be paid to luggage sizing and it looked as if everyone got their hand luggage on board despite a completely full outward flight. Both crews worked hard throughout the flights but we were starting to descend towards Mallorca before the drinks round reached us on the outward leg. Overall though one cannot complain when we paid under \302\243120 for two of us to fly to Mallorca for a week. When we first went there over 20 years ago we were lucky to find return flights for \302\243200 per person in low season.
## 1601 Flew Liverpool-Limoges with Ryanair returning on 15th May. Excellent orderly boarding and disembarking noticeably efficient cheerful staff particularly on return leg. I never eat or drink in flight I take a carry on bag that is restriction compliant and I make sure I have my boarding passes with me. Typically I buy my tickets 30/40 days prior to intended travel date and have always thought the prices offer excellent A to B value. Recommended.
## 1602 I have been a passenger with numerous airlines since 1957 and in recent years frequently from Alicante to several different British airports. Ryanair is one of the worst I've ever travelled with and definitely the worst on this route. On the outward Alicante/East Midlands Airport journey we sat on the runway for almost an hour because they had missed their slot. This made for a long and tedious journey. This however was nowhere near as bad as the return flight. We left plenty of time to return the hire car and arrive at the airport in time to have a leisurely lunch (as we always do at Gatwick) as we knew that it would be late when we arrived home only to discover that we could not enter the departure lounge until 2 hours before our flight was due to leave. This would have been okay if there had been somewhere for two elderly passengers to sit (all chairs were taken and we were left standing with all our luggage) or somewhere to have a decent meal (there is one very unappetising place with food served in cardboard). Also two hours would have been sufficient time if it hadn't taken more than an hour to wind our way through the queue to the check in desk. When we arrived at the desk we were told that our case was too heavy (1kg overweight) most airlines will waive this fractional overweight but the representative told us that we had only paid for 15kg and would have to put the excess in our hand baggage. This we did in full view of the other passengers and consisted of 2 tee-shirts and a pair of light shoes. Whilst we were waiting to board the aircraft the attendant asked us if we would like to put our hand baggage in the hold free of charge! My logic and fairly basic grasp of maths cannot make sense of this! I had been warned not to travel Ryanair and I never will again.
## 1603 I am disabled and booked for assistance with Ryanair at Birmingham airport. On arrival I was told to queue and check in before I could be given a wheelchair. My husband had to push the chair when we finally got it. At the gate Ryanair staff discussed who would not be able to take the flight as there were too many disabled. They talked about us as if we were bags of carrots. Eventually I said I would try to climb the steps of the aircraft and was allowed onto the plane. At no time was I given any assistance. On arrival in Malta I had to struggle to baggage and out of the airport as no assistance was available. You need to be fit and agile to use this airline. The treatment of people in wheelchairs was appalling and humiliating.
## 1604 Flight FR 749 10/5/2015 Gdansk to Birmingham. Bought XL space seat for 10.99 to have comfortable flying space after when all passengers been set up on the seats some guy who didn't pay for the seat just sat next to me. Obviously that space was free as nobody bought it. In my opinion if that space hasn't been purchased it is supposed to be unoccupied because it is not fair for these people's who actually paid for this spaces.
## 1605 We recently flew to Malaga from Liverpool going out our case weighed 15 kgs and out friends case weighed in at 17kgs. Coming back at Malaga our case weighed in at 19 kgs and our friends case was over the permitted 20 kgs and they had to pay 20 euros. Can you explain why this happened as we had not made any purchases and we had obviously used shower gel sun creams etc. so if anything they should be slightly lighter. Is this a con to get more money out of us. The girl on the Ryanair Desk at Malaga had an attitude problem and was very rude. Has anyone else experienced this?
## 1606 I flew Stansted to Valencia. The queue for check in was disorganised but the staff were helpful and friendly. The plane was clean the staff were again helpful and friendly - particularly in helping elderly passengers to disembark - and I was happy with the service.
## 1607 We travel a lot with Ryanair and find them only airline to be on time. We have just travelled to Bratislava from Birmingham and back. No problems with flight and going and return were given back row. Staff are getting much more friendly but my one gripe with Ryanair is the hand luggage. We only travelled with hand luggage and took great care to make sure the sizes were correct but I notice not everyone does and there isn't checking at all all sorts of shapes and sizes go through even the handbag sizes. This does cause a problem putting cases in the overhead lockers. Either there are rules or not. Travelled 9 may return 12 May.
## 1608 A return trip from Dublin to Malaga for a friends wedding the flight over left slightly late due chaotic boarding by the pax who seemed rather clueless as to what to do once you board a plane so you can't blame Ryanair for that. As per my last flights on FR they ran out of food and drink items and had a very limited selection and the service by a crew with a combined age of about 17 were slow and one rather got the impression that the four of them had just qualified the previous afternoon. They seemed stressed by the whole process and were again slow from the aft galley which is a surprise considering the lack of items they could possibly sell. There was a minor medical emergency where a pax fainted but they were quick and very attentive to deal with the situation. The flight back was again bereft of items from to purchase which was odd given that the plane was sitting on the ground the whole time I was at the gate before boarding (over an hour) but then even when you want to purchase something it's a bit of a guessing game due to the fact there are no menus. Anyway the flight began boarding early so early there were neither flight nor cabin crew on board. The flight itself was an awful experience due to being surrounded by children who took to screaming the majority of the time while their parents looked like they wanted to chuck themselves out the window. If I thought that the front of the cabin were an adults only area I would have paid anything to sit there maybe something to think about? All-in-all Ryanair are fine and are improving but it wouldn't be any harm to send mystery shoppers and auditors on flights occasionally to see what is really going on and realistically running out of the toilet paper hand towels. hand soap and saleable things like water is fairly unacceptable from a pax perspective.
## 1609 Flew recently Dublin to Birmingham return for \302\24320 return - unbelievable fare. Flights were very busy. There was the traditional queue for a Ryanair flight even though you have an assigned seat. I prefer to wait until the queue is actually moving and join the queue then instead of standing for no reason. No complaints about the flight - I think some of the food/drinks are overpriced but in general there is a good selection. I have noticed on recent Ryanair flights that the level of customer service have improved. There seems to be more Irish and British crew on the Irish and British flights too. I noticed the crew were especially friendly with the children on board with 2 young kids being shown into the cockpit as they saw the pilot on exiting the plane and the male cabin crew member on the tramac waving at other children as they came down the aircraft steps. Flight was good going back as well arriving in Dublin area. Great service for just \302\24320 return.
## 1610 I've been flying world-wide for more than 50 years with many different airlines. Despite many online complaints about Ryanair my experience with this airlines had been very good until my flight from Malaga to Venice (Treviso) on May 6 (FR 2597) when an incompetent female flight attendant and a very rude belligerent male maitre d'cabin (both Malaga-based) changed my perception of the airline. The maitre d' shouted and yelled and my son who expressed his concern regarding fresh air and cooler air temperature in the cabin. Ryanair is a budget airline and I'm aware of that but budget does not mean poor maintenance and rude and unfriendly flight crew. As a very frequent airline passenger I must point out that there are more and more budget airlines in the world and competition for the passengers is tougher every single day. Ryanair cannot keep playing the silly game of "We're cheap so we can afford everything and if you don't like that go somewhere else." I guarantee you that we will.
## 1611 I flew from Stansted to Tours. I was very careful to read and understand the rules. Two of us traveled so I booked 2 seats which also gave us priority boarding and enabled us to print off boarding passes well in advance. The flight was excellent as was the coffee. For such a short flight I did not need extra legroom even though I am well over 6ft. I have noticed that most complaints here are from people who have not read the rules and/or expect preferential treatment then blame the airline for their own carelessness.
## 1612 Unusually this was my first trip with FR for 4 months. CCF to STN return. Surprised to be allocated the same back row seat for both flights even though I'd not paid for seat choice. I thought these rear (and front) seats cost extra? Anyway not complaining as it meant speedy disembarkation at both destinations. Good to see that the Ryanair charm offensive has not run out of steam and they really do seem to be making serious efforts to up their public image. Return leg absolutely full but boarding was efficient enough and we arrived 20 mins early. Both flights were on two of FR's more elderly planes (those in the EI-DC* range) and frankly they are starting to show a lot of wear and tear which is hardly surprising when you consider how hard they work. Have the food and drink prices gone up recently? \302\2434.50 for a coffee and a biscuit seems a bit OTT to me but I guess you don't have to buy. In summary a couple of years ago I'd have advised anyone to avoid Ryanair at all costs if there was even a vaguely convenient alternative. Happily nowadays I'm quite keen to recommend them to anyone on any route if getting from A to B in the shortest time for the least money including bags etc is a priority.
## 1613 My husband and I have travelled the world with many different airlines and I must say that Ryanair are great. We travelled to Las Palmas Gran Canaria on 19th April returning on 29th both ways no delays and on time. Staff were great friendly and worked so hard up and down the aisle serving drinks and food nothing to much trouble. You are lucky if you get one drink on other airlines even sometimes on long haul. The only problem the seats were a little hard. We will definitely travel again with Ryanair.
## 1614 FR 3002 17th April. FR 3015 20th April. I have travelled with Ryanair for years now and in recent times the customer service and service in general has become increasingly poor. I travelled recently to Rome and this was a very poor experience - the flights were late the customer service was very poor and the cabins filthy. The yellow tagging farce is actually funny to watch - the policy as I was rudely told is the "first 90 bags" however it was totally random with customers with large trolley bags walking through and then other customers behind them being tagged?! There is no correct monitoring system for this whatsoever so you are at the mercy of the poorly trained staff on the gate. You then get onto the flight to find several spaces in the overhead lockers and several empty seats! Quite frankly I am fed up with the continual poor service so I have now booked with Aer Lingus for my next trip to Dublin. I am also at the stage where I will actually pay a higher fare in order to have a relaxed experience with well trained staff who smile instead or a rude and grumpy scripted person who cannot answer anything outside of that script.
## 1615 Flight out on the 29/4/15 was ok flight back not so good 3/5/15. No food left only chocolate snacks and crisps staff seemed as if they didn't know what they was doing slow and no organisation started from the front of the plane and we was at the back row 33. So not much left anyway but no sandwiches at the front of the plane as was sold out on the flight out. Very cramped. Paid for seats going out and to put a case in the hold (\302\24360) return what a rip off. But refused to pay for seats to come back. Will not travel with them again if I can help it.
## 1616 Flight 8386 and flight 8387 April 11th and 18th. First booking had filthy seats second booking - return from Palma. Because my suitcase was 2kg over I was charged 20 euros even though we had only one piece of luggage between 2 people. No food on flight as such - 1 sandwich also did not get the time to look at mag for inflight purchases.
## 1617 Eindhoven-Porto. Always chose another airline if I had the choice but back to Ryanair after this flight. 10 euros for an emergency exit seat were well spent on this 2.20 hrs flight. Very professional and polite crew smooth flight and on time performance. I like the fact that you can check in 30 days before departure when you reserve a seat. Big plus for people complaining they can't print their boarding passes while on holiday. Or use the app and store in pass book. No paper needed. The airports added to discomfort however: Eindhoven is too small for six Ryanair flight departing within 1.5 hrs and in Porto the baggage reclaim took half an hour.
## 1618 STN-MAD and SVQ-STN. Gate staff friendly and helpful slight delay on departure but made time up en route. Ryanair does what it says on the tin gets you from a to b with as little fuss as possible excellent value for the price paid.
## 1619 Used Ryanair on a way flight from Murcia to Stansted on the 30th of April which was fine. It was on time and I only had carry on luggage only and had printed off a boarding pass beforehand and as always if you play their game it all works well. The flight was only \302\24340 and considering I had driven the first leg at a cost of \302\243200 I have no idea how they manage to provide flights so cheaply. The cabin crew did their best but there was no milk for drinks or inflight magazines which was a bit of a disaster and raised a laugh with the passengers (well some of them with a sense of humour) and of course out came the dreaded scratch cards at the end of the flight but the plane was clean on time and I was happy with my trip and will use them again.
## 1620 Flew from Birmingham to Dublin for a day trip \302\24315 return! Flight out was faultless boarding is much better now with allocated seating and arrived 25 minutes early. Flight back was delayed around 2 hours apparently due to 'aircraft re-positioning' but did receive a text message apologising for the delay. Was after midnight by the time we departed and everyone I think just wanted to get home or wherever. Boarding was smooth again and otherwise no problems. It certainly won't put me off flying with them again.
## 1621 Flying from Faro to Glasgow Prestwick. I have flown with Ryanair before on short flights from Glasgow to Dublin which were fine (although had us standing outside in the freezing cold waiting to board for 20 minutes). Faro to Glasgow was a 3 hour flight and I am 6 months pregnant. I had to drag my suitcase up the stairs to board the plane and stand waiting there for a good 10 minutes until other passengers had taken their seats. When we arrived at our seats there was no room in the overhead stow for our luggage as other passengers had obviously ran out of space in their own areas and decided just to cram 4 cases into ours leaving us with nothing. My husband had to try and make room for our bags in stows away from where we were sitting. During this the cabin crew just gormlessly stood by and offered no assistance. Menus were handed out but only to passengers in the front seats as they didn't have enough to go round. It was a lunchtime flight and I was hungry and asked the stewardess while she was passing with the trolley if I could buy a panini. I was told they had ran out (again as there was only enough for the passengers in the front seats). No alternative was offered. The staff looked tired and fed up. Also there was a hen do on board with one idiot randomly shouting at the top of her voice. I didn't see any cabin crew addressing this. I would only fly Ryanair for very short flights if desperate. Will avoid in future and would certainly not recommend when over 3 months pregnant! Appalling.
## 1622 I use Ryanair several times a year and you get what you pay for no complaints except not being able to print off return boarding pass more than seven days ahead? Why? I don't want to buy an allocated seat. Gives many people no choice but to pay extra. I look for another carrier for my return when possible. On the plus side ground staff seem to be less aggressive and unpleasant these days.
## 1623 Went STN-MRS without incident during the flight. Although a few weeks before I received notice that the flight time had changed which required some workarounds in my own schedule in addition to the flight ultimately being delayed. Although everything was acceptable in general I also rather didn't like how non-EU/EEA citizens have to go to the bag drop line for visa checks which took an additional 30 minutes before going through security simply because the line was so long. I also realized the seats do not recline I'm not sure if this was because of the route or if all their aircraft are like this in general but I definitely would not want to go on a long flight with them if this were the case!
## 1624 Flew from Faro to Stansted on April 11th. Only one desk open for Bag drop off took over 2 hours to queue then no time to get a snack boarded plane with kids and flight had run out of most hot and some cold snacks. My autistic 12 year old cried and went melt down as a result non stop all the way back to London.
## 1625 Ryanair baggage policy and terms are very clear but on recent flights there was evidence that it is enforced. On the flight out to Seville it took 30 minutes for the cabin crew to make space in the overhead lockers because of the number of oversized bags. On the return flight to Stansted our luggage which complied with the policy along with the baggage of a third of the passengers was put in the hold while many oversized bags were put in the overhead lockers. If Ryanair have a policy they should enforce it.
## 1626 Over the past month I have been on four FR flights. The first two were short hops to the UK and back the first of which (to Manchester) the trolley service didn't even make it to me due to the short duration of the flight which I didn't really mind. The flight back from Bristol was a mess and possibly the hottest plane I've been on in quite a while. Overall the service wasn't too bad they left on time and popping cabin baggage into the hold at the last minute is a great idea really speeds up the boarding process once you're on board. Just back from Barcelona the flight over was as good as any but they ran out of certain items so one wonders what pax on the way back did for food and certain drinks and frankly the seat stays comfortable for just about the duration of the flight. Turns out I didn't have to wonder what the pax on the way back did there was barely even a bottle of water left on the plane I flew home on. The inflight service from the the back was incredibly slow which probably had something to do with the fact that the crew in this section clearly did not get along. This was maybe due to the lazy attitude of one of them who declared quite audibly that she wasn't walking back to the galley to fetch something as she "couldn't be bothered". I've been on a couple of FR flights in the past while where the cabin crew did not get along nor try to hide it at all which is something they could look at somehow. On the whole though I don't mind flying FR once you know what you're at and what to expect then you shouldn't have a major issue.
## 1627 Edinburgh to Pisa 14/4 returning 16/4. Excellent service at check in and in flight from Ryanair staff and flight crew. Enjoyed the coffee on board smiling efficient and helpful cabin crew as always.
## 1628 Flew from Luton to Malta April 1st. Plane late arriving but we were kept on the apron in the cold for the best part of an hour. No apology or explanation. We then missed our slot so another hour delay. To add to our misery plane had 20 or so "ravers" who were in a loud and lively mood. Stuff being thrown around no chance of any peace and quiet. Cabin crew did speak to the main perpetrators with little effect. These selfish idiots should not have been allowed on the plane as they were the worse for drink. Never had a flight like it.
## 1629 Four of us flew from Stansted (London) to Dublin on Good Friday April 3 2015. The gate crew and on-board crew were all friendly cheery and helpful the plane itself was surprisingly comfortable (muchmore comfortable than the United 757s we flew to/from Dublin the week before) and on-board food and beverage choices were decent and not horribly pricey. We departed promptly on time arrived on time and getting on/off was efficiently managed by the crew. Nearly everyone else on our flight was part of a huge school trip (kids about 12-14 plus their "keepers") and the crew members were great with the kids - kept them as organized as possible and were flexible about changing seat assignments so that friends could sit together - very nice to see! Here are the only two reasons I didn't give Ryanair an overall "10" rating: 1) I received mobile-phone alerts reminding me to do online check-in and get mobile boarding passes. Sounds easy enough but after four tries I was still unable to input our information - no explanation given. Finally on the fifth try it worked: I added all of the requested info (passport numbers etc.) for our party and then got a message saying "We are unable to issue mobile boarding passes" - again no explanation at all. Since I didn't have access to a computer or printer I began to panic especially after reading that there was a fee of 70 pounds per person to check in at the airport! Thank heavens our B&B owner came to the rescue and offered me the use of his personal computer and printer to complete the online check-in and print boarding passes. 2) We arrived at Stansted with more than two hours to spare before our flight got through security in record time and began checking the boards to see which gate we'd depart from. We sat down in the Coast to Coast restaurant to grab brunch while waiting all the while keeping an eye on the Departures board but out gate number wasn't posted until 15 minutes before departure time! Worse it turned out that our gate was a nearly 10-minute walk from the restaurant so all of on this flight had to do a mad dash for the gate at (almost) the last minute. I've never ever seen a gate number posted so late in the game especially when the gate was fairly far away - that was just baffling. Other than those two glitches however the Ryanair flight was a great deal for the money and I'd certainly fly them again.
## 1630 Flying home yesterday from Dublin flight FR 664 I felt unwell on arrival at the airport. We came to gate 105 and my wife spoke to the two check in girls to see whether we could embark first. They suggested that as we had pre-booked seats that we wait until everyone was on board to save queuing. They kindly organised a wheelchair and the cabin crew assisted me up the steps and into our seats. They also stowed our cases quickly. They also arranged for a wheelchair at Birmingham. We had wonderful service from everyone.
## 1631 After returning from Lanzarote yesterday with my family (3 generations) I was concerned about flying with Ryanair after all the bad press. However the flight time was good and the price was even better. I did pre-book seats as we were travelling with grandparents. The flight was ok. The crew were polite and helpful but despite offering an extensive 'cafe' service the only food available was a hot panini. As others have mentioned families were split as the flight was full then these people expected others to move so they could be together. I was not asked but others were annoyed. The flight was delayed and I lost count of the times the cabin crew and pilot stressed it was because of earlier problems at Manchester Airport not their fault. Minor niggles but t made for an uncomfortable atmosphere. All in all the crew were polite the flight was good (only an hour delayed) and the seats were fairly spacious.
## 1632 We flew Bristol to Girona and back. Flights left on time and arrived early. The cabin crew were helpful polite and cheerful. Priory boarding at Bristol and Girona was hassle-free and efficient.
## 1633 Manchester to Brussels during the French strikes. Ryanair continues to deliver what they promise and they are to be commended on that. Online check-in and only hand luggage meant that we were through security in under 10 minutes. Flight was delayed because of the strikes but the crew were cheerful and entertaining. If you follow their guidelines you don't really have an issue. We've flown 6 times with them in the last year (with pre-booked seats and priority boarding) and not really had a problem at all.
## 1634 Flight 2094 and 1672 for the return. 2nd-3rd April. Flew from Porto to Lisbon and back again. I was not expecting much given how little we paid for out tickets but was pleasantly surprised. Boarding at Lisbon was hectic and somewhat like an airport in Mumbai but that may just be the airport. Planes land passengers walk out and you board in all of twenty minutes. Fast and efficient. Flights were on time and pleasant overall. Seats comfortable and quite roomy accommodating my 6'2 frame easily but of course they don't recline. Print out your boarding passes always goes without saying. Unbelievable value for money if you follow the Ryanair formula and abide by their constraints.
## 1635 I fly with either Ryanair or Monarch at least once a month. Ryanair check in make me feel like a second class citizen as I often need a wheelchair. I have been made to stand away from my husband whilst they check my medication bag. I offered to bin it but they argued that my letter states that I need the injections. I now go without it if I fly Ryanair much to my consultants dismay. The last time the wheelchair assistance helper even had to speak to the check in desk as they were so rude to me. It's cheap so I put up with it but that is all they have that makes me use them each month.
## 1636 Travelled back from Dublin to Leeds on a flight that was supposed to arrive at 17.30 on 31/3/15 but after 2 x attempts at trying to land in Leeds we were eventually diverted to Liverpool. This was due to strong winds and was a safety precaution fair enough I hear you say. This isn't really my gripe but the after care. The cabin crew told us that coaches were being laid on and would be a few minutes to arrive after around an already 1hr delay however when we went to the Ryan Air desk the representative advised she knew nothing about the 120+ passengers or any coaches! After being kept waiting she eventually told us that some coaches were being arranged what happened to the one that were a few minutes away? After a 3hr wait sat on a cold floor (no seating) the coaches turned up and we were face with a 1hr 45m journey to Leeds. When asked for tokens for water and a snack the rep advised everyone there weren't any tokens. Absolute terrible aftercare. Ryan Air: We've got your money now you are on your own. Never ever again.
## 1637 FR9885 from Derry to Liverpool on 30 March. This was the return to my trip made on the 22nd. The flight departed about 20 minutes late due to a delay on the inbound flight however we landed bang on time. Well done to the pilots. Cabin crew were friendly and helpful as always. If you don't check in a bag I really do think it's worth paying the extra \302\24310 for priority boarding and a premium seat as it makes your journey a lot smoother and more comfortable.
## 1638 A recent return flight with Ryanair from Barcelona to Tenerife North. Full flight both ways cabin crew friendly on both flights. Two bar services during 3hr 20mins. Paid 68\342\202\254 return no luggage good value for money. Idiots holding boarding up as incapable of sitting in their allocated seats and then having to get up again and move around the cabin. Not Ryanairs fault. Stupid travelling public!
## 1639 Flight FR9884 from Liverpool to Derry on 22 March. This was my third trip on this route and just like on the previous ones the flight left in good time and landed 15 minutes early. The crew on board were friendly and welcoming as always. Ryanair has not once let me down. They're efficient and punctual so for that you can only love them. I'm not understanding why they get as many negative reviews as they do.
## 1640 Flying from Oslo Rygge to Stansted several times a year. Never any problems Flights on time or even before schedule. Last trip 18 March to London and return 23 March. Flight attendants friendly and service minded. An improvement when Ryanair scrapped free seating and allowed one more item of hand luggage.
## 1641 Last week I flew Ryanair for the first time. I didn't expect much from low-cost so I wasn't disappointed in any sense. The flight was from Gdansk to Stansted. I purchased priority service and 15 kg hold bag allowance. At check in desk they spent 5 minutes checking my documents since not many non-eu travelers use this service. They even printed me a "conventional" boarding pass. At the gate there was an expected 15 min wait in a crowd on the stairs leading to apron. Not pleasant for parents with crying children all around but bearable for solo traveler. A short walk to the plane then got to my seat. Since it was an exit seat can't say anything about standard legroom. What I had was fine. No seat recline. The seat was ok. Announcements were not noisy. Flight took off late and landed before schedule. I didn't buy anything onboard. Long walk on arrival. Bag on the belt when I was off the immigration. Don't have an idea what if things went wrong but what I got for my money was predictable and trouble free. Other options from Gdansk to London were Wizzair known for carry-on charges or conventional airlines with higher prices and transfers at major hubs. I preferred direct service. If took 2 hours and 68 USD to take me from G to L.
## 1642 Flew Dublin - Budapest return. No problems whatsoever. Packed flight took off and landed on time both directions. You do not pay for the toilets no one forces you to buy anything on board nearly every airline charges for hold luggage and seat selection. Not Ryanair's fault if a school party has purchased seats.
## 1643 FR1449. We flew with Ryanair on Sunday 15th March from Lanzarote. This was the 1st time we have flown with Ryanair and it wont be the last and I think the bad press they get is unfounded. Congratulations on a good 1st flight.
## 1644 No nonsense good value and on time! However was disappointed that they wouldn't provide me with a glass of water without my paying \302\2433. Understand about charging for everything else but I think that they should be able to provide a glass of water especially given all the health benefits and the need to keep hydrated.
## 1645 Return flight from Manchester to Rome \302\24358 return plus extra legroom seats over the wings for \302\24310 each way bargain. Both flights on time and smooth didn't buy any food or drink and enjoyed the extra legroom. This was my 3rd flight with them and would book again they get you there and back on time and at a good price.
## 1646 I used the new business class when booking my flight mainly due to the price. Whilst the cost is reasonable to be honest it wasn't worth it. I didn't take luggage so no cost benefit to me. At Stansted I did get through security about 10 minutes quicker. Priority boarding going out was standing on the Tarmac for longer. The return from Morocco didn't give me any benefits as whilst the priority boards were first onto the bus to get to the plane everyone else was on the bus so we had to stand in a long queue. I do feel you should provide a hot drink and a snack at least as part of the package. Regardless of this the staff as always are helpful and kind. This experience won't put me off using Ryanair but may just stick to economy as the business cost is too much for too little.
## 1647 Had a positive and pleasant experience flying to and from Tenerife South from Edinburgh. Better than our last two trips with Jet2 and Thomson. If you read the rules and follow them there is no problem. Priority boarding was adhered to so no stampede needed. The staff were efficient and pleasant. I will definitely use Ryanair again.
## 1648 FUE-EMA 05/03/15. Yet another excellent flight. No hassles at airport good service inflight bang on time landing. For a snip fare why complain. Only gripe is with those passengers who don't pay to pre-book seats but expect those that do to move so they can sit with their kids. Last 2 flights from FUE have had families creating because they want to sit together. Here's a hint pay like the rest of us then you can and you wont have to resort to insulting the crew to get your own way. Crew by the way handled the situation brilliantly.
## 1649 As a non-EU passenger who lives in London UK I have to fill out a landing card whenever I am coming home. With any other airline landing cards are offered to persons like myself during the flight. This saves time filling it out later at customs. However they are never offered on Ryanair. On a recent flight home from Gdansk I decided to ask the crew for a card since I figured that they would not voluntarily offer one. The crew member stated that they would bring one and did bring me some sort of card which was half in Arabic half in French which appeared to be for passengers arriving in Morocco. It was completely different to the standard form. Later in the flight I spoke to another member of the crew about it pointing out that it was the wrong type of card. She giggled and mumbled something about hanging onto it 'just in case.' I pointed out that she was not making any sense. How hard would it be to carry some landing cards on the flight? If this is for some reason not possible then perhaps the staff need better training in terms of what to do if a passenger request one. Perhaps they could simply tell the passenger 'sorry we do not carry those on-board.' The whole episode was just silly.
## 1650 After a speedy boarding (as you'd expect from a budget airline) we went onto the plane. Inside was an eyesore. Bright yellow everywhere and everything was cheap and 'plasticy.' Bright horrible advert were everywhere - even seat backs - and you had to pay for a newspaper. The food was expensive and the service below average. The seats were cheap and flimsy and uncomfortable. You weren't allowed to get stuff out of the overhead lockers for some reason. Even though our flight was just over an hour it was awful and I will never fly with Ryanair again. Yes they are a budget airline but the only reason you'd fly with them is if you were skint.
## 1651 I travelled from Dublin to London recently. I had a fractured ankle and needed to use a wheelchair. I asked Ryanair for special assistance through their online chat site and I couldn't have got better treatment anywhere. They made my journey so easy as a wheelchair user. Everyone was helpful and made me feel very comfortable and in no way a nuisance. This was the same in London and Dublin.
## 1652 Flew from Aarhus (Denmark) to London Stansted on Sunday 15th February. Flight punctual but flight crew unfriendly and had an issue with a child occupying one of the emergency exit seats but who's fault is that when all seats are allocated prior to boarding? Never once did I see a smile from the two female crew and seemed to see passengers as a necessary evil of their daily job but the male steward was more approachable but he had a ticking off about something with the in-flight catering by a more senior stewardess in earshot of myself which was most unprofessional. If you just want a flight then great but if you expect to be treated as a valued customer steer clear.
## 1653 The boarding process seemed entirely disorganised and very little information given regarding the flight's delay. When in receipt of information impossible to hear what was being said as engine noise was too loud and flight attendant too quiet with a slight language barrier. I wouldn't have known if there was any sort of emergency or if things were running smoothly! Which leads me on to the abrupt attitudes from all flight attendants not only this but please ask them to smile once in a while they are after all working in customer service.
## 1654 Ryanair is the only airline that flies from Bournemouth direct to Malta so great so far as very local. However the purchasing of tickets is laborious and time consuming. The cost of the flights easily double should you reserve a seat (standard elsewhere) or want to stow luggage in the hold (standard elsewhere). The cabin crew were unbelievably poor and one even had a broken shoe ripped trousers un-ironed shirt and jacket and tie that was thrown on. Looked like he had been pulled through a hedge backwards - never seen anything like it. About to start the onerous process again for this years holiday as flying locally is great but oh why don't they just try to raise their standards they should be ashamed of their business as it stands.
## 1655 Excellent flight once again on Ryanair certainly the most consistent low-cost airline. We departed 10 minutes late but arrived on time cabin crew were friendly and very efficient in convincing people to buy food. The seat pitch is much better then Wizzair or EasyJet.
## 1656 I had a return flight London Stansted to Athens during February half term with Ryanair. I paid exactly as I expected as I did what Ryanair asks - checked in online and print boarding passes at home. The flight out was very busy and we were told at the gate that our cabin baggage would not be allowed in the cabin. However taking a small bag on board was not an issue so we could take books etc onto the aeroplane. The flight left STN around 20 minutes late which happens so arrived slightly late. However the return flight landed early. The cabin has enough space for me at 6 foot tall and despite being a four hour flight it was fine. I can't knock Ryanair as the return trip was under \302\243100 including all the fees. Bargain.
## 1657 I have recently made two return trips on Ryanair. I am 6 ft 5 in (1m95) tall. Whilst I recognise that I am taller than average I am by no means unique these days. When the pilot said we should sit back and enjoy the flight - I was unable to comply. I was travelling with my wife. Had I not been then I would not have been able to contain my legs in my own space allocation. Recently the seats seems to be even more upright allowing less space still. I was not able to turn the pages of my tabloid newspaper adequately in the space between my chest and the seat in front and the newsprint was so close to my face I had to remove my spectacles to read it. Altogether a bad experience and I am questioning whether I will continue to use Ryanair in future.
## 1658 FR8386 Jan 30. FR8387 Feb 2. Just come back from a long weekend in Majorca paid \302\24375 for two return. I lhave been on lots of cheap flights in the past 15 years about six per year! All been great been to places that would have been unaffordable in the past.
## 1659 I didn't have high expectations for this airline having used them a couple of times before however on this trip (Stansted to Berlin and return) they actually performed quite well. The outbound trip was on time the return about half an hour late. Seats are not that comfortable but are bearable for short flights. It was worth paying the supplement for extra legroom seats and priority boarding. Staff on board were helpful and courteous Food purchased on board was ok and the coffee excellent. The only let down was the poor service in the airports at each end but this was outside the control of the airline.
## 1660 Logged into the site to print out boarding cards three days before flight from Stansted to Lanzarote and told that normal seating couldn't be booked until the Sunday were due to fly out at 7.15 am. So I had no option other than to pay an extra \302\24320 for 'allocated seating' which turned out to be no different from normal seating. Friends have also reported this experience. Also been caught out by paying travel insurance because to opt out of this is not made clear. Used Ryanair frequently and they are good in term of price and punctuality but I'm always wary of 'tricks' they can pull to extract more money.
## 1661 I'm embarrassed and confused to find myself writing a positive review on of all airlines the dreaded Ryanair! I've flown them a dozen or so times and always found them punctual clean and friendly staff generally value for money. The sales pitches were pathetic but seem to have been mostly removed. Seat pitch at around 23 inches is terribly uncomfortable but Monarch is much worse. 29 Jan 2015 FR3208 Manchester to Malaga. Manchester airport suffering from a 1 inch 5cm snowfall they were unable to cope with causing many delays and cancellations this is not the airlines fault just plain bad airport management. Arriving very late for the flight due to traffic delays the friendly gate staff smilingly allowed us onboard (45 mins after boarding began). As soon as we boarded the Capt announced a 30 min delay. Calculating a 5 hour delay I immediately asked to be disembarked - the capt responded immediately arranging stairs and ground crew. In minutes we were off with helpful crew around. As we entered the terminal the airport announced closure and the flight delayed by 90 minutes plus. Fact was it departed 4 hours 46 minutes later. We cancelled our seats. A few hours later I received an email advising that I could claim a refund or another flight. I opted for a refund and a few hours later received confirmation the refund had been processed!
## 1662 London Stansted to Riga 28th Jan out and 30th Jan back. Once again an avid Ryanair fan like me gets a bargain of a ticket for \302\24339.98 return! 2060 mile return journey for this price you cannot fault it! Play by the rules it is a piece of cake! Coming back we were 1.5 hours late due to snow at Stansted but easily forgiven because an airline cannot control the weather!
## 1663 MAD-CIA. Last minute option but the experience was good for the price paid. Departed and arrived on time. The only issue is the stewards trying to sell too many products during the trip.
## 1664 On a flight back to the UK from Dublin last night (26th January) we were surprised and pleased to hear that we would arrive back 20 mins ahead of time. On arrival at Gatwick the stairs were moved to the door ready for us to disembark but there seemed to be a problem and the cabin crew did not open the door. We sat there and waited and waited but not once did any member of the cabin crew explain to us why we were still sitting there. Eventually after some considerable time we used our own initiative and used the exit at the back of the plane. At no time did the Ryanair staff say anything! So much for Health and Safety. Seats were cramped and uncomfortable but as I am only 5ft 4ins not too bad for me but must be horrid if you are tall with long legs. Will try not to use again.
## 1665 PRG-STN. Get what you pay for. Was mildly annoyed when I checked my reservation and saw that my only options as a non EU was to print my own boarding pass why no mobile option like everybody else? Check in desk was opened an hour before boarding and manned by one person. On the other side (for premium members?) there were 2 more employees but they were too busy giggling and messing around to consider taking a few passengers off the hands of the sole employee for economy. he was very friendly/quick and didn't seem at all jaded or phased that it was him vs 200 plus people. As I was in the front of the line my wait was short. The flight was full and everybody seemed to have carry on that well exceeded the limit so I was glad I paid the extra and checked my bag. Nobody was called out re succeeding the luggage limits so overhead space was at a premium but they got it all stowed. Cabin comfort was average and flight crew were pleasant enough. Arrived on time/luggage was offloaded quickly. All in all it was still a great price and well worth the money for the convenience of a short direct flight.
## 1666 On the morning of 14/1/2015 were flying to Malaga on flight FR655 from Prestwick. We were called to the departure gate the aircraft could not have been further away from the gate we had to walk around 100 meters in terrible rain and sleet. The wind would have cut you in two to make things worse the aircraft was loading from the front only by the time we got onto the plane we were soaked to the skin this is no way to treat passengers. I do not think I will use Ryanair again. The seats are so close it is hardly possible to stretch your legs.
## 1667 East Midlands to Malaga If you follow the rules you get a cheap flight but at what cost. The seat is poor even for budget airlines with the leg room the worst I have known in 30 years flying. Then there is the width. Yes I am a big chap but I have never had to ask for an extender belt it went no where near. Dignity lost but cheap fares and safe arrival.
## 1668 FR2111 Oct 1st 2014. We have flown with Ryanair many times (EasyJet as well). Between them they are generally the cheapest way to travel. We've never had any problems at all. It clearly states when you book and in later emails you have to check in online. Its not rocket science. Its a no frills budget airline so why should you you get free food and drink? The cabin crew have been ok on our flights. They often use airports further away from the main cities. Again it clearly states this in the airport code name! Cheap fares no frills mostley on time and a safe airline. That's all you need.
## 1669 Unbelievable value Stansted to Vasteras (mid-central Sweden) for \302\24349 return. Flight out on time small delay return. Hand luggage taken no problem. Flight crew were good but I couldnt understand their English on return flight. 737-800 decent plane but difficult to use toilet if you are a standing male over 6 feet tall.
## 1670 After spending Christmas with my family in Uberlingen Germany my husband and I struggled back to Memmingen Airport for the Ryanair flight back to Stansted on 27th December in freezing blizzard conditions and it was no surprise to us or other people waiting for the 14.40 Stansted flight that we were advised there was at least an hour's delay in the arrival of the Ryanair flight out of Stansted. Eventually it arrived and we were called to await boarding. We were then told to cross the tarmac to the plane for boarding. However when we reached the plane we were not allowed to board. There was a barrier over both entrances to the plane. The whole plane-load of passengers were kept outside on the tarmac in windy freezing conditions for about 15 minutes. There were babes in arms tiny children and elderly people standing outside a plane we had been given permission to board in freezing conditions. People in the queues were shouting to be allowed to board to no avail. When I returned home I wrote to Ryanair: requesting an explanation as to why passengers were called to board before the plane was ready when the plane was parked just outside the Airport buildings and also asking that the explanation be passed on to all adult passengers aboard that flight. I thought that would be the very least they could do. Ryanair sent an acknowledgement of my letter saying they were looking into the matter and I have not heard from Ryanair since.
## 1671 Lanzarote one way flight from Bristol 8th January. A handful of minutes late departing and arrived Arrecife half an hour early. Totally uneventful flight. What more do you want?
## 1672 Ryanair is fine to fly most of the time to get from A to B and if you can go hand luggage only. But that isn't always possible and today at Alicante the Bag Drop was pretty shambolic and stressful having to queue for more than an hour to drop off a case with people getting more and more frantic as the clock ticked by. It might have been because they had about 6 full flights scheduled one after another in a 2 hour period and only 3 desks for bag drop off. Plus they were charging everyone who was even just slightly over the weight which led to queues being at a stand still as people tried to rearrange their luggage or go and sort out the extra payments. If this is a frequent occurrence (will be watching as am a frequent flier) I will definitely avoid Ryanair as much as possible in the future. I will and have paid the premium for the extra business fare but the huge omission is that there is no priority drop off. Unlike Easyjet who give priority at bag drop if you have speedy boarding/easyjet plus. Makes the business fare bundle all a bit pointless since you have allocated seats anyway. If Ryanair introduced a priority drop-off as an optional extra I would happily pay it rather than stand in a queue for an hour.
## 1673 Rome to London Stansted 31 Dec 2014 cabin crew never greeted or smiled as we boarded plane - looked very fed up and engaged in no personal chat during the flight. Very uninterested and worked more like zombies going through the motions. Flight was good and would travel with them again. I paid \302\243136 return - it might be cheaper than other airlines but surely the staff represent the airline and what did this service say about Ryanair?
## 1674 Malaga to EMA due to snow we were told we would be diverted to Stansted Airport. Subsequently we were provided with a coach back to EMA. The second half of this journey proved very challenging due to the snow but we arrived at EMA 3.5 hours later. Although very stressful at the time we appreciated the speedy response in getting us to EMA.
## 1675 We have flown Rysnair on the Birmingham - Trieste route 2 or 3 times a year for the last 4 years. This route hasn't appeared for 2015 and having contacted the airline all it can say is "keep looking". This simply isn't good enough. Ryanair will know already if it will operate this route this year. I suspect they want passengers to book alternative routes but Stansted really isn't an alternative for us. We live in Staffordshire and petrol plus car park fees would cost more than the price of the flights. Come on Ryanair.
## 1676 I have no issues with Ryanair. Given how cheap the tickets are I think the airline offers a good deal. Ok the seats aren't the most comfortable and the cabin crew are expected to sell sell sell but who cares. I can get to many European destinations for less than the price of a return train ticket to London (just 50 miles away from where I live). I am happy put up with a few minor inconveniences for deals like this. Just one minor gripe - I hate the recorded fanfare when the plane lands early or on time.
## 1677 My wife and I live in Spain and had booked a flight from Malaga to Stansted and a return flight from Stansted to Malaga some five weeks later. The night before our flight out of Malaga I duly went online to the Ryanair website to do the Online Check In. I filled in the flight details and submitted it then there was on option to print the Boarding Pass however I didn't have a printer my apartment so I assumed that since I had submitted the details all would be fine. This was not the case however. On arrival at Malaga Airport the next day we went to the Ryanair check in point that was at least 100 metres away from any other check in desk (probably so that other passengers could not hear any passenger complaints) We were asked for our Boarding Passes. I said that he had checked in online but had no way of printing the Boarding Pass. The Ryanair representative said that her computer was not showing that the Online Check In had been done. Although I insisted that I had submitted the Check In form online there was no way that I could prove it. The Ryanair Online Check In requires that the submit button is clicked on numerous times as it wants to sell extra luggage allowance hotels car hire and selected seats. If the submit button is not clicked on by-passing each of these selection options then the Online Check In does not go through. The Ryanair representative said that we would have to pay 70 Euros each for not submitting the Online Check In and for printing the Boarding Passes but as an alternative we were then told to take our laptop to the Ryanair Information Desk where they could have 15 minutes of free use of the Wi-Fi to find the details. The Wi-Fi was password protected however and the Ryanair staff member was not exactly showing any signs of wanting to help. I am of the opinion that it was extremely difficult if not impossible for a passenger to be able to retrieve the data. With time to board fast approaching we had no option but to pay 70 Euros each a Rip-Off total of 140 Euros to print two boarding passes. No wonder that several review sites describe Ryanair as "The World's Most Hated Airline".
## 1678 Round trip from Barcelona to Porto for 38\342\202\254 direct. Unbelievably cheap. The service this year is much better than prior years. Follow the rules and expect the worst and you will be pleasantly surprised. Print your pass ahead of time get your passport stamped and only take a carry-on.
## 1679 Although some people had not spoken very well of Ryanair. I have the opposite to say. In both destinations in Athens and Stansted I found the staff very polite and very helpful. They were very organised and I was pleasantly surprised. The seats on the aeroplane were not too comfortable but for a short trip it didn't matter. The plus point was that travelling with a small child the arms of the seat lifted up and being flat it was easier for my daughter to sleep on the journey. The only down point that I could say is that the staff talking on the intercom I could not understand very well their English or Greek. This could have been a fault of the intercom. I found them excellent and compared to other airlines very competitive. It was the first time I had travelled with them and would do it again. I gave fair for value for money but that's because all flights from Greece to England are far too expensive. Please bring the price down or make more offers.
## 1680 Manchester to Dublin and return December 2014. On time clean budget airline \302\24372 for 2 people return? Bargain. Follow the rules and you can't go wrong.
## 1681 BCN to STN return. I used to dread flying on Ryanair though in practice I had very little choice. The last year has seen a major improvement as a result of their charm offensive. Gone are the rugby scrums to get the best seats the petty case weighing and the inflexible enforcement of rules. Most of the recent flights I've been on (these two included) have been pretty full but there's been the opportunity to move to a less crowded section in spite of the usual 'not allowed due to weight and balance of the aircraft' nonsense trotted out by the purser at the start of the flight. I was surprised on the outbound sector that they used the jet way piers at BCN thereby loading from only the front door and rendering the boarding process rather chaotic and long-winded. First time I've ever seen this on a FR flight and you can see why they prefer a front and rear door approach. As always both flights were on time and it may just be that I've become immune to them but the intrusive sales related tannoy babble during the flight does seem to have been cut back. As others have said if you stay within their rules flying Ryanair can be reasonably pleasant these days. May it long continue.
## 1682 Outbound from Birmingham - Trieste on 11th Sept returning 25/09. This continual drivel about paying for boarding cards at the airport. Why do people persist in doing it? Print the boarding card before you leave for the airport. It's that simple. Priority boarding why? All seats are allocated before you walk up the stairs. I travel with Ryanair 2 or 3 times per year. No complaints. The main complainants are passengers who cannot follow a few simple rules. So why blame the airline for their own inadequacies?
## 1683 Have flown with Ryanair many times over the last few years at least 15 flights cancelled once due to heavy snow but very efficient at rebooking for the next day although a different airport - travel expenses refunded. Other than this no delays over a few minutes and generally time made up during the flight. Although we are not tall - 5ft 4 and 5ft 7 no problems with legroom size of seats. As long as you know the restrictions around bags size should have no problems at all - made very clear on their website.
## 1684 Flying from Stansted to Lanzarote in November we were unable to land owing to extreme weather conditions diverted to Fuerteventura where we sat on runway for two hours before flying back to Lanzarote. Flight back to Stansted was cancelled on two days owing to bad weather during which time passengers stayed in the airport and given food vouchers every two hours. Transport was provided to 4* hotels on both nights where meals were provided. Finally on flight to Stansted landing was delayed owing to a security alert so we had to circle for about half an hour. Overall a bad experience but not Ryanairs fault and during whole time Ryanair flight crew were brilliant. I will certainly have no problem with flying Ryanair again.
## 1685 Travelled from Bristol to Tenerife on 29/11/14 and returned on 2/12/14. Recently travelled with Ryanair for the first time and found it a pleasant experience. Online check in extremely easy and bag drop off and boarding quick with little queuing. Slight delay on way out but this was made up and arrived on time. Return journey left on time and arrived early. Would travel with them again.
## 1686 NCL-DUB-NCL. Return flights from Newcastle to Dublin both on time worth the price (\302\24350 return) comfy seats good legroom for the price. Only thing bad is the card machines never seem to work on any of their flights which was a letdown as I had no cash. Would definitely be using Ryanair again and would recommend this airline to anyone.
## 1687 London Stansted to Oslo Rygge on November 13th. \302\24319.99 one way including taxes you can't go wrong with Ryanair for a nearly 700 mile plane journey. Flights on time as usual straight forward flight. Ryanair are very much on- time or early every time I fly and I use them 5-6 times per year. Follow the simple rules relax and enjoy the flight.
## 1688 Recently flew Ryanair from my local airport London Stansted to stay at a friends apartment in Paphos. I visit Paphos regularly and many times fly in to Larnaca as there are more flights to LCN and make the 90 minute drive to the West Coast resort. However for convenience of a bargain flight and an airport about 12 miles from my doorstep STN I flew Ryanair. On this occasion I have flown this route with this operator before for pure convenience as opposed to the BA LHR to Larnaca flight I took in August offering all scheduled services meals beverages etc. Ryanair offer basically a seat and free use of the toilet everything else comes at a price and experienced over four hours of constant sales. The seating cramped. For a medium hall flight just over four hours I found the 737-800s seating too cramped. But for economy and convenience Ryanair offers what it is a no frills basic airline!
## 1689 We were a party of 4 that flew out to Malta from Bristol on 2nd November 2014. I had pre-booked seats and needed special assistance as I had broken my leg 4 days before travelling. We had no complaints at all about Bristol everything went smoothly. However Malta was a different story on our return to Bristol on 9th November 2014. We had no bags to check in so went straight to the Departure section. Though I had pre-booked our seats and we should have had priority it was like a free for all the operative walked around the queue collecting boarding passes. I again needed special assistance and was subjected to a lecture from the Maltese operative because I had not checked in for this assistance. Nowhere on the boarding pass did it say I needed to check in just go to the departure gate. I informed the flight crew that I could not walk to the rear door (our seats were at the front) but no notice was taken of this and I had to wait until the cherry picker was brought to the front. A very officious young lady informed me I was delaying the plane as the next flight could not load. When we returned home I found an email dated the 4th November (we flew out on the 2nd November) informing me what I had to do to obtain special assistance. Not satisfactory to send an email after you have already arrived at your destination.
## 1690 Bristol - Malaga on 21 November 2014. Perfectly good flight left and arrived on time - yes it's a bit spartan seats don't adjust no reading material but then the price is the attraction. Rather amused by the cabin crew asking those boarding to "hurry up as others are standing in the rain" - if Ryanair used the ramps no-one would be in the rain.
## 1691 London Stansted to Frankfurt Hahn on Nov 8th return Nov 11th. This is by far the worst airline I have flown and I am 59 years old and have travelled all over the world in many different airlines. The customer service can not be worse respect for the customer (after you have paid) is horrible. They are charging 70 British Pounds for printing your boarding pass or sitting you in a crowded airplane with uncomfortable seats with crew members that are air merchants who charge you extra money for even a glass of water. Also after you have paid for your ticket or are in the process of paying they come out with a series of add-ons that when you end paying this nightmare of flights from third class airports like London Stansted or Frankfurt Hahn end up costing you the same or more than flying with a prestigious airline like British Airlines or Lufthansa from a premium airport.
## 1692 Flew LBA to Riga. What's all the fuss about Ryanair. Stick to the rules print your Boarding Pass before you get to the Airport and everything is fine. Clean modern 737-800 both outward and return on time. Cabin Crew very pleasant. Cabin Manager very keen on safety aspect - which is good. Why do people leave their seats when the seat belt sign is on I do not know. Well done Ryanair - will certainly use them again.
## 1693 Flight to Tenerife Sur for 15 nights and returned on 8/10/2014 - absolutely no complaints regarding flights both ways. Both on time booked seats for extra comfort and staff were courteous and efficient. However on return to Glasgow (PIK) it was torrential rain. We were put off the plane onto the runway to make our way into arrivals. Within a very short time we were soaked and to add to this an overflow pipe was gushing water ensuring we were thoroughly wet through and adding to our discomforts! Not good enough Ryanair this could have been a perfect 10 a little more customer care and consideration is necessary.
## 1694 Have flown Ryanair from Bristol to Dublin return now for last six years (10/11 flights per year with other flights to Portugal and Spain in between). Only on one occasion have we been unreasonably delayed all other flights have been on time or indeed often a little early. The price is right and if you abide by the Ryanair terms and conditions you will have no problems whatsoever. Their planes are always well maintained on the interior and looking at their reliability record all round also. With regard to IFE legroom etc you get what you pay for and cannot complain. I would highly recommend them to anyone.
## 1695 Athens - Thessaloniki 17/10 Flight FR1066. Thessaloniki - Athens 20/10 Flight FR 1067. Aircraft always full. All fees charges and extras up front. Ready for take off within 10 minutes of first passenger setting foot in aircraft. Cabin crew move like greased lightning. Punctual. Aircraft emptied quickly. Be absolutely certain you have boarding pass printed out before arriving at airport otherwise you are slaughtered for about 75 quid each which is about the total cost of a cheap printer.
## 1696 Flew Edinburgh -Gdansk return. I didn't pre book seat but was allocated one free. This meant I could print off boarding passes at home for both legs of journey and with 10kg hand luggage (plus handbag) there was no queue to stand in at airport just straight to security. Fabulous! Liked the fact there was a priority boarding queue even though I wasn't in it. Boarding front and rear of plane. Very efficient. Flight on time. Plane clean and seemed plenty of room for everyone's luggage. The seat on the plane was one of the most comfortable I have encountered on a short haul carrier and I even managed to have a very relaxing shut eye. I have travelled with Thomas Cook several times recently and the flights were very uncomfortable. On outward leg of this journey I was at a window seat and was invisible to cabin crew however on return journey at aisle seat crew very pleasant and helpful. Overall very impressed excellent value for money and will sing Ryanair's praises to family and friends.
## 1697 Flew from Manchester to Charleroi and back with wife and daughter. The flight only lasts an hour and 10 minutes so it was OK. We had no luggage to check in and had booked priority boarding. The flight was punctual both ways. The flight crew was polite. The reason that at times they have to be a bit pushy is that people take an eternity to get settled and low cost airline have to stick to strict time schedules. I hear lots of horror stories about Ryanair but I assume that if you stick to your part of the deal it is OK. I think for a short flight that we took it is very cost effective and one can overlook some small niggles here and there.
## 1698 Knock-Faro-Knock 23 Oct. First time I've flown from Knock Airport found it so strange as everything was so near no long corridors etc. Was with my mother who needs a wheelchair all assistance good. Was very wary of using Ryanair as normally travel with Aer Lingus especially with a wheelchair I needn't have worried as everyone was very helpful. Fantastic that you can book seats I went for "PREM" seating rows 3B/3C outbound 2B/2C inbound. Faro based Portuguese crew on both directions and they were excellent only gripe is selection of food/drinks is only average but I found they have improved immensely since I gave up flying with them about 3 years ago I would certainly use them again.
## 1699 31/10 FR293 from Stansted to Dublin 19.40. Left it late to advise gate 88 instead of 49 - loads of panting passengers. Also they have a very relaxed attitude towards schedule and timekeeping. Sat for ages awaiting confirmation of passengers etc prior to takeoff. Ryanair customer service appalling as staff members more interested in selling priority seats than helping people who had missed flights due to traffic problems. Oddly we sat there waiting for one passenger - how does that work? I am now looking to avoid Stansted as its like a third world airport.
## 1700 Barcelona to Birmingham FR9162 31st Oct. Love Ryanair so much better now with allocated seating and the extra bag makes so much sense - can now take my handbag and my small suitcase on with no problems. Had more of a problem with Monarch - I had to empty the contents of my handbag into my duty free bag - what a waste of time as I was still taking same amount on to plane!! Well done Ryanair for sensible rules.
## 1701 Dublin to Lanzorate to Dublin in October flights cost almost \302\2431000 for 2 people. Boarded the plane took our seats I'm tall and ended up looking at my knees for the duration of the flight. Looking for somewhere to put my newspaper and the other normal things you bring onboard - there was no little pocket at the back of the seat in front of me with the result I had to pile everything on my knee leaving the tray table in a very awkward position. The lady came around with drinks I ordered a coke which turned out to be the smallest can of pepsi in the world for 2.50 euros. No frills 100 per cent low cost not really. Would I fly Ryanair again? Not unless I was really pushed.
## 1702 Flew from Birmingham to Barcelona last month excellent flight and service. Arrived ten minutes ahead of schedule. We fly with Ryanair at least six times a year and have never had a problem. Yes - there are a few rules and regulations but if you abide by them there shouldn't be any problems. We are flying to Dublin next week return ticket less than a one way train fare to London! The added advantage of being able to take two bags as hand luggage has come as a real bonus.
## 1703 Paphos to Rome. FR 9697. October 31. Business Plus is a waste of money if there is a bus from the terminal to the plane since then one does not receive Priority Boarding. Also there is no Priority Deboarding so if one is in row 16/17 and there are exits front and rear then one is last off the plane and last at Passport Control. To be of value Business Plus passengers should always board first and deplane first. This would mean that the passengers would travel in a separate bus and all the Business Plus seats should be at the front of the plane just as in any other airline.
## 1704 We flew to and from Cork from Stansted and had no problems whatsoever. Flights were bang on time crew were nice.
## 1705 We flew Stansted to Ancona for a few days at the end of September. A lot of the reviews here knock Ryanair but I have to say I was very pleasantly surprised by the service provided. Apart from that awful jingle on landing the inflight experience was fine and the cabin crew polite and helpful. Stansted passenger handling airside is appalling but that is not Ryanair's fault. I will definitely fly Ryanair again as long as it is hopefully not from Stansted!
## 1706 Flew from Leeds Bradford to Dublin. New "customer service" standards mean you don't have to queue down staircase anymore. Ryanair have decided passengers need fresh air. So we waited alongside aircraft stand in cold windy weather with free kerosene fumes thrown in! Looking forward to the day when Ryanair learns what "customers" really are!
## 1707 Just returned from a trip to Budapest. There were 6 people in our party. My wife and I were outvoted and Ryanair was selected because they were cheaper. As first time Ryanair flyers we were extremely worried about all the hype that seems to follow Ryanair. The check in at Stansted was smooth and friendly no waiting. The flight was 15mins late taking off but arrived early. The plane was clean and more room than I had when I flew with Virgin. No problems at all! Stick to the rules and you will be pleasantly surprised.
## 1708 AGP - LPL. Usually fly with easyJet but Ryanair had a more convenient time for our return from Malaga. Had to pay for seats in order to print off boarding passes before leaving home so went the whole hog and paid for priority boarding as well. Didn't encounter any problems although the boarding agents did not arrive till 10 minutes before the gate was officially due to close. No checking of hand luggage dimensions nor application of ruling to allow first 90 bags only onboard as far as we could see so the last passengers to board were struggling to find locker space. Perhaps with a late night flight staff are more concerned about getting home as quickly as possible. Almost 15 minutes late taking off but made up time en route. Cabin crew were friendly and worked hard both helping passengers to stow bags and then later serving refreshments etc. Overall a relatively painless trip though not as relaxing as with easyJet. Minor gripes - the "leather" seats are rather unforgiving after a couple of hours and the announcements from the cabin and cockpit crew often difficult to hear as Ryanair's Boeings seem noisier than easyJet's Airbuses and crew tended to gabble anyway.
## 1709 FR5262-FR2345-FR2525 (SVQ-BVA-GSE/10 October) on the way back (GSE-AGP/13 October) flying with 2 kids (3.5 and 1.5). Found there are no better routes connecting SVQ and GOT/GSE these flights were the best option. As a point to point airline Ryanair never puts any responsibilities for any delays causing missed connections. We had a sharp 2 hrs at Paris to catch the next flight while the first flight from Seville was delayed a slightly over an hour due to extreme weather. You cannot expect a better pilot on SVQ-BVA route who was very informative and explained to us the delay causing him to change the parking three times and eventually used the airbridge. Flight from BVA was delayed allowing us to have an extra time. Return journey was fine. All in all very satisfied with the flights. We enjoyed both food along the way. They are kind with the cabin baggage. Ryanair today seems to be the 2.0 version than the one in 2000's. Very pleasant flight!
## 1710 Flight from DUB-PMO. Have flown Ryanair many times and so long as you stick to their policy have never had a problem. Aircraft was almost new pleasant staff food ok for the cost flight departed on time both ways usual scrum for seats although seats are allocated. You can print your boarding passes from 2 hours up to 30 days before you fly - this information is not in the fine print it's in bold print and you even get a follow up email well before your departure date. Reading some reviews not sure that a 24 sheet billboard parked in the driveway would be a big enough prompt. We fly Ryanair every time we visit Europe.
## 1711 Flew with Ryanair in September been traveling with them twice a year to Crete from LBA never had a problem and always been on time - sometimes early. The foods not all that good and the seating a bit cramped but its a budget airline. We always book our seats and get priority boarding and this time fast track for a couple of quid. For all the extras we book it still works out very very cheap compared to all other airlines. It seams a bit of a rush at times but what do you want? I want to get on get there get off and start my holiday.
## 1712 Very pleased and surprised by Ryanair. First time we have flown with them. Leeds Bradford to Crete. Pleasant air crew efficient comfortable. Return flight 40 mins early.
## 1713 My wife and I fly regularly from Luton to Nimes France we are pleased to get some cheap flights and the journey is not long and we are o/k with the plane and crew but why at Luton do the staff or authorities check our passports and boarding passes and send us outside the departure lounge to wait for the plane to be ready in all sorts of rotten weather under a flimsy open canopy.
## 1714 Flew STN-CIA-STN with flights on time for both parts of the journey. Everything was what one might expect of a low cost carrier so no surprises there. However I missed my first flight due to 'visa check' procedures they require for those who are not EU/EEA citizens. Even though I did not require a visa for either of my destinations their insistence on this was not the real problem however but that they had so few agents working that this process took much longer than the security check on both legs of my journey. So it really spoiled my experience (especially in missing my first flight which then caused me to incur additional charges to get onto the next flight) simply because they did not have enough agents working. Additionally because they made such a fuss over 'checking visas' I would have assumed they would be able to provide UK arrival cards on-board since they would know non EU/EEA citizens need these as I've always done this with any other flight instead of having to fill one out after landing. They however did not have these on the return flight which meant I spent even more time at the UK immigration check simply because they did not have them.
## 1715 EDI to MLA return end Sep/start Oct. First time with Ryanair after spending the last 10 years avoiding it. No choice but to fly with them due to virtual door-to-door nature of route for quick Maltese holiday with a bit of business thrown in. Was expecting the worst but pleasantly surprised by on-time flights for both sectors decent if unspectacular seating and lack of the patrolling of queue by staff looking for oversized baggage - it appears that they've chilled out a little. So nothing to complain about as such other than \302\2434 for a 330ml can of Heineken which I obviously passed on. Would fly again but it's going to take a while for me to lose my prejudices about this airline.
## 1716 I have nothing but praise for Ryanair. I flew for the first time (alone) at 75 years old from Stansted to Alicante and back. Nothing to write home about maybe but I suffer from dreadful claustrophobia and have not used public transport for over 40 years! I did book an aisle seat and found it perfectly comfortable the staff were polite and helpful also fellow travellers who when I asked gave me details of what to do where to go etc. Was a little off putting when my cabin case on the return journey was put in the hold it was correct size and underweight and lots boarded after me with cases. I would certainly fly Ryanair again.
## 1717 14th October Manchester to Ibiza 06.15 left on time and arrived just 5 minutes late which is an exception for Ryanair as I travel with them about 6-7 times a year. The plane was a quarter full and the service basic but the cabin crew did their job professionally. I will keep using Ryanair because their prices are extremely hard to match and their rules are simple just read the terms and conditions and be patient too many people criticise them because they don't know any different well done Ryanair once again and thank you! 1000 miles of air travel for \302\24325.99 is a huge bargain!
## 1718 Used Ryanair for the first time recently and found the experience very good. Got to destination on time with no problems whatsoever. Seat comfort was ok for the 3hrs 15min flight with adequate legroom for my 6 foot tall frame. All in all happy with the Ryanair product and will fly with them again if price is competitive.
## 1719 Flew Frankfurt Hahn to Plovdiv and returned a couple of days later. The flights were on time and the planes were reasonably clean. We travelled with hand baggage only and didn't pay extra for seat allocation. We travel regularly with Ryanair and rarely experience problems - I find them more reliable than many other airlines. The return flight was 2 1/2 hours and I think that this is the limit that I'd be prepared to fly with Ryanair. After two hours you do start to notice the hardness of the seat and lack of leg room but for short flights they're good.
## 1720 I travelled from Frankfurt (HHN) to Stansted (STN). The flight was as good as any cheap airline. Can't say much about seat comfort or staff as you really don't expect that from them. Really new to the concept of bringing your own boarding pass from home and being charged if you don't. I'm pretty sure there will come a time when these airlines would want you to bring your own seatbelts and oxygen masks. The ground staff very strict for checking your baggage weight. First at the check-in then again after the security check which was an inconvenience and didn't really make sense. Overall it serves its purpose of getting you from point A to B.
## 1721 Excellent flights to and from Prestwick to Palma. On time quick check in at Palma - stick to rules and no problems ever. Its the people who are the problem - 5 flights in 3years never a problem.
## 1722 Like many I was reading bad reviews before my trip so was expecting bad things but my experience from Luton to Beziers on 27th Sep was faultless for a budget flight on time departure and return pleasant staff smooth flight and no fussing over hand luggage size both ways. What do people expect if you want more fly with more expensive airlines and expect delays.
## 1723 Once again a brilliant flight to Tenerife. No problems whatsoever we fly with them for family holidays at least twice a year and have always found the staff to be very helpful. We are already looking for our next holiday and will definitely be flying Ryanair.
## 1724 We went to the check-in desk friendly young lady and once on the plane we were seated together hand luggage no problem plenty of leg room for the first time ever my knees did not touch the back of the seat in front of me. The cabin crew were attentive and there was a choice of reasonable priced food and drink. Coming back printed out boarding passes in hotel and had seats together again. All the bad press Ryanair receive as far as we are concerned is completely unjustified just keeping fingers crossed me writing this has not put the mockers on any future flight we may have with Ryanair.
## 1725 I fly all over the world and even use low cost regional airlines in the states but this takes the cake. Checked in online but couldn't print boarding pass. No notes online that there are huge fees to print at airport. There was no clear check in sign in Edinburgh but thankfully also no queue and 3 staff standing around chatting. When they finally decided to talk to us and tell us of the 20 pound check in fee they said they couldn't help us and we had to use the check in machine well across the way. The check in unit wouldn't process us and told us to see agent. The agent couldn't take our money and sent us all the way round to baggage to pay for boarding passes but then we had to take receipt back to first woman to get actual boarding card and drop prepaid bag! Our hand luggage was grabbed at the gate and we were made to pay \302\24350 even though it was within weight. Flight was delayed an hour originally but left 2 hours late to Dublin. Flight should have been an hour but with delays took over 3 hours. Stay away from this airline!
## 1726 I am extremely dissatisfied with the service I received on the evening of 26th Sep in Wroclaw airport related to a Ryanair flight. I paid extra for priority boarding both to and from Wroclaw. We departed from Cork last Sunday night and all was fine apart from minor delays at the final door prior to leaving the airport to make our way to the plane. On the other hand the service that we received in Wroclaw was an absolute disgrace. Both myself and my friend were the third and fourth in the queue went through the first check in gates to go down to the foyer leading to the Tarmac and plane. The other q passengers then went through their check in procedure. We all were massed in this small foyer for approx 20 mins and then they decided to open the gates and push approx 6 different families with buggies on top of us. Needless to say it was absolute bedlam by the time the doors were finally opened. There was an elderly Polish lady who had also paid for priority boarding who was pushed out of the way with the stampede to get to the plane. They really need to look at your procedures around check in and boarding as I have never experienced anything like this before. I would suggest that people with buggies should be checked in first and that these then should be placed in the foyer. The next passengers to be checked in should be priority passengers as after all they have paid for the privilege of this service! Finally the passengers who are in the alternative queue should then be checked in. The door should be manned to ensure that priority passengers are treated fairly.
## 1727 I have always praised Ryanair as good value when considering the cost however they really let themselves down on 29th Sept. Arrived at Stansted near midnight and could not even see terminal from where plane stopped. Then had to wait nearly 30 mins as staff had not thought to arrange transport even the pilot was fed up with their lack of organisational skills. Sorry Ryanair very disappointed.
## 1728 Actual flight both ways was good but the handling at Stansted and Rhodes wasn't. We felt like cattle not customers. Stansted we were held up getting to airport we had priority booking but had to wait with everyone else as priority queue had gone therefore one of the cabin bags had to go in the hold. At Rhodes we were first to check-in and they took the first 90 cabin bags in the hold. Surely it should be the last? There seems no reason now to take cabin bags at all! The benefit apart from the cost is that you can exit the airport much quicker at your destination. Waiting for cabin bags takes as long as waiting for large luggage. The overhead luggage compartments were half empty. It just seems like another Ryanair useless rule.
## 1729 Flew Ryanair many times however most common route I fly is KIR-LTN. Most recent flight SNN-SXF. Ryanair is a very good airline in my opinion. Despite flying to airports that only the CIA has heard of and advertising the airport for the capital city of Slovenia (it's Bratislava) as Vienna it's very handy. I use it often and I have never had a problem with Ryanair. Even with hidden fees tickets for me seem cheaper than Aer Lingus. The aircraft are clean but still somewhat dark and gloomy and the seats are uncomfortable horrible on a late-night flights or dawn when you try and catch some sleep however still possible. The snacks and drinks on board are still a reasonable price and the crew are friendly. The toilets are excellent being bright and clean. Ryanair gets the job done.
## 1730 Very short flight from Barcelona to Palma (FR 6362) yet the crew managed to do their inflight service and the usual thing of hawking a few scratch cards. What was more amazing is that the crew were in a good mood seemed happy enough to be there and actually seemed to like each other - they even had the pax laughing! After numerous FR flights with miserable looking crews this was a pleasant surprise. Maybe the new positively is filtering down to the cabin crew? Only downside is the trumpet sound or whatever it was when landing but great all round otherwise.
## 1731 I flew from Bournemouth 22/09/14 to Carcassonne and returned 26/09/14. Staff were friendly and helpful at both airports I didn't see one query about baggage for any passenger and the plane was early on both flights. Although worried about the bad reviews that I read before I left I wouldn't hesitate to fly Ryanair again.
## 1732 DUB to BVA on the morning flight. Bought the ticket online 2 weeks ahead and it was cheaper that the taxi ride to the airport. Did not expect much but I was quite impressed with them. I work as Cabin Crew so I do know how to travel with a low cost carrier. I paid the extra 10eur for a seat on the first row. Extremely comfortable and thanks to the included priority boarding hassle free experience in the airport. My bag was a bit bigger (the side which was supposed to be just 20cm was slightly larger did not experience any problem). Staff extremely polite and professional both in the airport and in the air. Flight landed 5min early in BVA so absolutely nothing to complain about. I paid 23eur for a flight ticket and got early to my destination on board a brand new Boeing 737 aircraft (the aircraft had been delivered only a week before). I will definitely fly Ryanair again.
## 1733 Flew from Bristol to Malaga arriving 4.5 hours late due to technical problems. Sat on the plane for an hour or more before being told it could not be fixed. Were not informed that we could have vouchers for snacks found out by chance that by producing the boarding pass at the counter that we were entitled to \302\2433.50 each. When we eventually took off at 10.30 pm we arrived at Malaga to find that our shuttle service had gone. This was now around 2.30 in the morning. Had to take a taxi at an extra cost to us of \302\243100 - eventually arrived at our destination at 3.30 am - not good for two 73 year olds! Came home to two emails from Ryanair telling us that we were not eligible to the over three hour delay compensation due to some clause - a real get out clause if you ask me.
## 1734 We travelled with Ryanair to Majorca two weeks ago I had booked assistance for my husband due to his mobility problems and found the staff at both ends of our journey so very helpful I cannot thank them enough. It made what l thought was going to be a rather stressful journey easy for us both. We were given all the help we needed in a pleasant and friendly manner.
## 1735 Bristol-Malta-Bristol. Family of three. Having travelled extensively on major carriers world wide with 500000 miles under my belt and having read all the negative reviews I was apprehensive about using Ryanair for a family holiday- my concerns were unfounded. Both sectors were seamless ground crew and flight crew were polite and helpful. Got on got off arrived safely at a fair price - no problem. Only issue is the holding pen at Bristol an excuse for an international airport - not the carriers fault though. Quite impressed really!
## 1736 Travelled on 10/09/14 - having booked airport wheelchair and assistance for boarding to gate and vice versa for departure and both return flight. To my dismay no wheelchair had been arranged at the Dusseldorf Weeze airport. Bus driver unlocked padlock of chained up wheelchairs. Stewards failed to inform arrival airport of my pre-booked requirements. Staff should also insure that passenger take their allocated seats - had a lady whose body posture was extremely intimidating and hostile because she could not get out fast enough caused by her sitting in the wrong seat. Flying back same problem again - staff did not inform Stansted airport of my pre-booked requirements. Was stranded for more than 15 minutes outside the aircraft on the tarmac before porter with wheelchair turned up. I shan't forget the blank expression on the faces of the aircrew staff either which made me feel very uncomfortable I'm sure it can be improved with more staff training and please slow down the food and drink trolleys as no one gets a chance to buy anything at this speed and it might cause an accident.
## 1737 Flew NCL to Gerona flights were on time and staff well trained and helpful. We have used Ryanair quite a few times and have never had problems with delayed times staff etc. The only niggle is that sometimes the cabin could be cleaner!
## 1738 Again very pleased with Ryanair. FR9885 from Derry to Liverpool flight departed about 5 minutes early and arrived 20 minutes ahead of schedule. Pleasant flight with friendly crew. Another thumbs up for Ryanair.
## 1739 FR9014 Stansted to Barcelona 05/09/2014 and FR8322 Valencia to Stansted 10/09/2014. Both flights were excellent both on time and the staff were lovely.
## 1740 16th September from South Tenerife at 11.40. Seat's hard to sit on for a long flight no comfort in them at all. No inflight Entertainment on long flights.
## 1741 I fly Ryanair and easyjet to Malaga from Liverpool every 2 weeks and have done so for 2.5 years. The service from both is good and Ryanair are normally the cheapest. I have had 3 delays due to weather and one diversion to East Midlands last year due to the weather. I do hear complaints every now and then on flights for both airlines the majority by people who are not seasoned travellers and only fly on limited occasions. The complaints were mostly why cant I sit at the front because they see these seats are free but they are told you cant have these seats as the aircraft needs to be balanced. Most accept this others don't and they hold the queue up by arguing. Then you get the guy and his mate who hover around the extra leg room seats to see if they can get one and they block the aisles and hold the queue up. Now that allocated seating is on all aircraft these problems seem to be resolved apart from the odd idiot who says I want to sit next to my mate but we did not get that option when we booked so can you sort it this again holds the queue up. With regards to the aircraft staff yes they have their bad days but that is not surprising as they see the same type of idiots flying in and flying out. The expression you pay peanuts you get monkeys however does not apply to the majority of staff I have come across and the vast majority of regular travellers appreciate the stewards and the service they give. If you wish for a better service then dig deep and save up for the next ten years and you can fly business class.
## 1742 Business plus plan: Smoke and Mirrors. I just went on a business trip and took the opportunity of travelling with Ryanair on their new Business plus plan. Just as an aside I fly regularly with Ryanair (no choice) and usually book and pay for all the options so I went for 'all the options' in a package that promised a 'bit' more and cost 70 euros more. The flight was from Dublin to Nice (France). The offering was 1) Flexibility on ticket changes 2) 20kg baggage allowance 3) Fast track airport security 4) Priority boarding and 5) Choose your premium seat. So this was all pretty good and I bought into it all. I did not need to use #1. #2 is standard. #3 I wanted and at Dublin Airport there was a gate for this that put us behind people being let into the fast lane for clearance (no big deal). When it came to the return flight this was not an option. #4 is standard. However at Nice everyone was let through the check in at the same time (there were two queues) and most priority passengers were way to the back of the ensueing melee - all were then herded aboard a couple of busses so no priority. #5 is standard. Bottom Line: Business plus plan is a total fake intended to take more money out of business passengers without giving them anything.
## 1743 Travelled STN-VLC (Valencia) on 8 September and back on 12 September. Trip going out was very good. I am 6ft 4in tall and had one of the emergency exit rows over the wings and there was plenty of space. Cabin crew very attentive on the way out not so much on the way back but still good. Over 2 hour delay on the way back as the plane had to go to Ibiza for "operational reasons" first and then come back and take us to London. So long as you play by their rules and are not an idiot when it comes to reading their instructions they are not a bad airline to use for short trips.
## 1744 I travelled with Ryanair for the first time 25/8/14 to Gran Canaria. The flight (4 Hours) was very unorganised by the flight team. The air host and hostess sat at the front of the plane as was I for extra leg room spent half of their time looking in the mirror in the bathroom playing with their hair and touching up lipstick. The staff at the back of the plane frequently came to the front as they were having some kind of disagreement and arguing over some gossip from another flight attendant that was not present during our flight. It was a he said she said thing that involved all of them. My partner and I were not able to get seats together when I booked for extra leg room for us both so we had aisle seats however the 2 seats in front of my partner were empty and it would have been nice for attendants to have offered us the seats so as we could sit together. I have to say our flight home was much better and the flight attendants were friendly helpful and professional throughout. Our flight on the 25th August 8132 at 14.10 was appalling.
## 1745 Same as before I flew from Liverpool to Derry with no trouble whatsoever. I was travelling only with hand baggage so of course was able to bypass the bag drop desk. Ground staff and cabin crew were friendly flight departed 5 minutes early and landed 10 minutes early. The flight itself was pleasant enough. I couldn't ask for better from Ryanair.
## 1746 Flew from Prestwick to Palma Mallorca 25th Aug no problems at all easy check in as we had actually managed to print our boarding passes which a lot of people seem 2 have a problem with although I don't know why I'm hopeless on computers and I can do it. Return flight 2 weeks later again no probs used Ryanair 3 times now with no bother this time I got return flights that were almost as cheap as the cost of my taxi fare to the airport will be using them again I think people are making their own problems just so they can moan!
## 1747 FR7941 from Bournemouth to Ibiza 29th. August 2014 and FR7942 Ibiza to Bournemouth 5th. September 2014. Aircraft on both flights clean well presented and well above the standards of other airlines and we have used many. Cabin crew on both occasions bright professional and more than willing to please passengers' Indeed on the return flight Capt Turner saw passengers off from the front steps. I wish people would stop moaning stick to the rules and give Ryanair the credit the airline deserves.
## 1748 First of all Ryanair are a budget airline so don't expect anything other than a basic service. The seat pitch is famously squashed but for an extra fee you can book priority seats with extra legroom and priority boarding. Our flight from Stanstead to Kefaliona was 3 hours long on time and the friendly crew kept us entertained and well informed throughout the flight. Take an iPad if you get bored as there is no entertainment. If you want a cheap flight with a no frills airline with a good safety record Ryanair are a good choice.
## 1749 Free allocated seats? This is a joke of a company they try to get money for one way or the other. It's free only if you Check-in 7 days before but if your trip is more than 7 days then you will need either to pay for the \302\2435/\302\243 10 for choosing your seat and print and tale the printed ticket with you or you will need to pray that you can find internet and a printer on your holiday destination. I will not recommend this company to anyone. Avoid like plague.
## 1750 22 and 29 August. Flew from Dublin to Faro return service onboard was terrible. You couldn't even understand the captains announcement because he seemed grumpy and the cabin crew were exactly the same. They didn't even have an inflight menu or magazine. Cabin crew didn't even have a smile on their face.
## 1751 We travelled from Gatwick to Dublin on 31st. 3 adults and 4 small children. Check in girl was so helpful she rearranged seating so we would be near one another and she took 5 pieces of hand luggage free of charge as check-in. Excellent service.
## 1752 Fly regularly with Ryanair from Leeds Bradford to Alicante and back. Have never been delayed. You are only buying a cheap seat and you do not have to buy anything else. You are only on the plane for a short time and reclining seats and fancy service are not an issue.
## 1753 I have flown Ryanair many times over the last few years and never really had a bad experience though it was clear they were pushing the low cost model to extremes. My most recent trip was the first since their change of direction and things have improved: best is reserved seats which makes boarding much more civilised the selling of food and other items seems lower key and the 'another on-time arrival' jingle is less irritating than it was - though I could still live without it. It is still a fairly basic service but not too dissimilar from that offered by other carriers on intra-European routes. Ryanair finally seems to be aware of what attracts customers apart from low fares and is addressing some of the issues I hope it continues.
## 1754 FR5579 21 July returned 28 July on FR5578. My family and I travelled to Benidorm for 7 days. Our travel with Ryanair was less than perfect. On the flight over I ordered a small bottle of Prosecco the flight attendant went for ice and when she returned she knocked over the ice and in an attempt to catch it she knocked the bottle over which spilled over me. She did not apologise until about 15 minutes later and at the time she just picked up the bottle and said it is only a little amount. I had to get up and go to the bathroom to try and soak up some of the wine. Thankfully it was white wine. On our return flight I badly needed to go to the toilet the flight attendant was talking for a while with the co-pilot and finally I had to stand up. I was told from the toilet to sit down I was again told to sit as the co-pilot had to use the bathroom which he did however when he came out they again continued talking. I again stood up to be told sit again but this time she then indicated I use the rear toilet as the captain was to use the front facility also. (I was in row 9). As I approached the rear toilet the flight attendant there told me to go back to my seat I had to sit down the fasten your seatbelt sign was on I tried to explain and eventually stressed I had to use the toilet \342\200\234now\342\200\235. Then the attendant from the front called the rear and said to let me use the toilet which I did. The was very stressful especially in front of all the other people on board I do understand the need for safety on board a plane however the f act the staff have extended conversations amongst themselves as opposed to taking care of their paying clients speaks volumes. I will avoid using this airline again if at all possible I am extremely disappointed.
## 1755 Flew with Ryanir EDI to POZ KRK to RYG and RYG to EDI. All flights were on time with clean aircraft and attentive crew. I know you only get what you pay for but my family and I fly Ryanair regularly to visit family in Poland and I have never had cause to moan grumble or complain in over 30 flights. Make sure your bag is the right size and weight print your boarding passes or use the new app and turn up on time.
## 1756 Travelled 24/8/14 FR8747. The return to Stansted on Ryanair from La Rochelle was ok. The experience at La Rochelle was ok and the inbound flight arrived 15 mins early. Boarding began at 10 for our 10.30 flight. The doors where shut at 10.30 and the safety demonstration was played in English and then French. We were off around 10.35 just 5 mins behind schedule. The inflight service began with drinks and snacks. I had a pepsi which was in a small can. Then the duty free service before rubbish during our decent over London. We landed just before 10.45 10 mins early. Yet again no fanfare but a little announcement about there low fares and the fact they have a 90% punctuality record. Overall they just get you there on time which is really all that travel is so I would recommend them if you are on a budget or Stansted is your local airport.
## 1757 We flew from Edinburgh and got there in plenty time. Queue was not at all bad. Service was excellent. On the way home from Lanzarote the queue was again not bad service was good. I also have to say that the cabin crew on the flight from Lanzarote to Edinburgh on 18th August were brilliant they were attentive cheerful and very helpful.
## 1758 We have flown Ryanair many times without problems. If you know what to expect then you wont get disappointed. However upon arriving at East Midlands airport for our flight to Tenerife South recently with plenty of time to spare we found that there were 12 flights departing at roughly the same time. 12 flights of people that needed to check in and clear security before boarding. It seems that Ryanair just bung everyone together regardless of which flight you are on Some people were panicking as their flight was taking off soon and were stuck at check in when asked to jump the queue were told they would have to wait like everyone else! It took us 2 hours to get through check in and clear security. Queues were snaked round the airport (although admittedly this is not Ryanair's fault!) but a better system needs put in place for Ryanair check in. We managed to get to the boarding gates just in time albeit at the end of the queue. There we were kept waiting for 20 minutes as staff now needed hand luggage to put on the hold. The staff member was very aggressive and rude to us trying to grab our bags to put in the hold we told her that we needed the bags for inflight and one contained valuables that we wanted to keep with us. She tried to snatch my husbands backpack from his back and took my daughters small suitcase from her before I took it back. We eventually offered one bag but I had to remove everything that was needed and carry it in my hands she wouldn't even give us a carrier bag. She went up and down the last remaining passengers trying to grab peoples hand luggage but as nobody else would offer a bag she came back to us telling us she needed our bags we refused but She wasn't having any of it and barked at us we didn't have a choice as we were at the end of the queue and if we didn't put our hand luggage in the hold we would be fined \302\24360. Her attitude was appalling and if she'd have asked politely we may have tried our best to accommodate her request. She wouldn't let the last people through the departure gate thus holding up the flight until she had the bags But no way were we giving up our remaining (small) bags. We eventually got on the bus to the plane and on the flight there we sat for another 20 minutes before actually taking off! It was never made clear that only the first 60 passengers were guaranteed to take their hand luggage. Yet on our return flight home everything was smooth queues moved quickly and staff were very pleasant helpful and polite. We packed our bags accordingly and offered our hand luggage for the hold. We fly Ryanair because it is cheap but cheap doesn't mean but I expect to be spoken to like dirt from someone's shoe!
## 1759 Just flew from Faro to Londonderry and I have to say that I was extremely surprised at the standard of flight and service provided having never flown with Ryanair before I was more than dubious about the flight but having taken priority boarding and allocated seating I could not find fault with any of the procedures. My husband and I definitely rated it much higher than are outward journey with Easyjet so my advice is give Ryanair a chance and like me you may be totally surprised with the quality.
## 1760 FR505 Bristol UK to Dublin IE August 19th. With all the bad press and negative reviews about Ryanair I vowed never to fly with them. However on balance it was better than expected. Friendly flight attendants and apologies about the slight delay on departure. There was enough leg room for my liking even being a male of average height and the aircraft was clean. The only thing I would do is remove the garish yellow. But that's a matter of taste. Ultimately exceeded my expectations so kudos to Ryanair. I think the key is to stick to the rules which have been relaxed slightly recently and you'll be just fine. Wouldn't really advise priority boarding as it was pointless with seating now being allocated.
## 1761 I use Ryanair regularly flying from Dublin to the Netherlands. You get what you pay for. Fast boarding a flight with reasonable service and quickly into the terminal once the plane has arrived. The staff aren't particularly friendly and clearly look as if they are under pressure for the entire flight. Upon reaching the gate the flight attendants have often told passengers that they only have 20 minutes to get the plane turned around and to get off quickly once the doors are opened. This often leads to a push when getting off. To avoid this I remain seated until people have started getting off. Because of the short turn around time it isn't unusual to find some else's rubbish in your seat pocket however flight attendants do go round with a rubbish bag before the end of the flight so it's caused by inconsiderate passengers rather than the airline. Overall if you just want to get there on time and you are not concerned about the service fly Ryanair.
## 1762 STN-DUB-STN; I was expecting the journey from hell on the way out but in fairness the outward journey was far from unpleasant however the seat wasn't brilliant it was harder than a rock however there wasn't much in the way of on-board advertising on the way out and we were in Dublin on time. The return flight a few days after was quite badly delayed we were probably in the air about 30 minutes after we should have left Dublin. We did board and got underway after a while but there was the substantial delay (which went without explanation) and then they had the audacity to start flogging superfluous amounts of miscellaneous tat. After spending an hour in a queue in Dublin T1 I don't want perfume or scratch cards I want quiet! Ryanair are perfectly okay for those who want a cheap holiday but I would much rather pay the extra and fly with either BA or Aer Lingus from Heathrow.
## 1763 Leeds Bradford to Palma 1/8/14 FR2326. Palma to Leeds Bradford 8/8/14 FR2327. Having not flown for 14 years because of a fear of flying I decided to take the plunge and book. Past reviews about Ryanair made me nervous and my computer skills are a little rusty. However having read the instructions my husband and I printed off our boarding passes etc without problem. I found Ryanair staff to be very courteous and understanding of my anxiety issues. I had a good flight both there and back and would use this airline again.
## 1764 Last flew with Ryanair 10th and 15th Aug 2014 LPL-BCN-LPL. Excellent flights both ways - an unexpected bonus was getting premium seats and priority boarding at no extra cost when we checked in online two days before flying. Cabin crew courteous and friendly and both flights although each about 10 mins late pushing back from stand landed on time. Use Ryanair about 12 times a year and have never had a bad flight except for one (MAN-FAO Feb 2014) which was delayed because of storms which affected all flights to Southern Europe that evening. Crew were trying to be helpful but abusive and drunken behaviour from a mixed group of twenty something's caused us to miss our revised take-off slot while the police removed them. As long as you read the website carefully and follow the booking and check-in instructions Take a bit of responsibility for your own arrangements then there shouldn't be a problem - although it never ceases to amaze me how many people forget to pack their brains when they travel.
## 1765 9th August FR8241. Have just come back from Mallorca having flown for the first time with Ryanair. Have to admit was very worried due to comments made about flying with this airline. We found the check in lady very pleasant and kind who made checking in our luggage very easy. The aircrew were helpful and cheerful and although we were late leaving by 30 minutes could not have served us any better. It was very busy at Mallorca airport on our departure and we had a bit of a wait in the queue but this was because most people had not checked the weight of their luggage so were re-packing. Staff not as quick as from Bristol but once we were on the plane the cabin crew were lovely.
## 1766 Flew in May BLQ-RYG (Bologna-Oslo Rygge) the plane was almost empty there were 40-50 passengers on board that was good because I was able to sit in the emergency exit seat without paying anything more! The flight was OK the plane clean. The crew gave us food twice on a flight of two hours. I recommend Ryanair!
## 1767 Flew Edinburgh-Alicante. Had allocated seats so didn't see the point in queuing like a sheep. Joined the queue when there was 5 people left got my partners bag checked into the hold free of charge due to lack of cabin space. Took our seats and our nice smooth flight was over and done with in 2hours and 40minutes as scheduled. On board there was a few hiccups the cabin crew hadn't handed out the inflight magazine which includes the food menu and were only three aisles away from me I asked for a book and calmly stated "you should have already handed these out!". The stewardess immediately apologised and offered me an extra 10% off perfumes which I did not use. Also in the row behind us was three kids (in three seats with no adults) one young child proceeded to kick my partners chair rather violently whilst the parents were relaxing with headphones on unaware to their child's misbehaviour again a quick word to the stewardess and an adult was moved beside the children and the mischief stopped. My only concern is I am a tall man and with having not booked extra legroom I found the flight quite uncomfortable.
## 1768 This flight is OK. The new Ryanair is the same quality as easyjet or Norwegian. There are improvements which made the journey fine and we will fly the airline again. We got to new Stansted airport and the experience was OK. Boarding opened 1 hour before and began 40mins before. The plane departed on time and smoothly. There are no advertisements on the overhead bins and there where no scratch cards. An ok trolley came with food for sale. OK priced. Better than the airport. We landed 15mins early and no fanfare? It was a shock but fine so you don't wake up suddenly. It was a good trip with an improved service. Travelled 17/08/14 STN-LRH 07.30.
## 1769 FR1448. Ryanair really can't help annoying customers can they? Now there are allocated seats priority boarding has no real value. So what do they tell you? - "If you want to guarantee to have your hand luggage with you on the plane then you should pay for priority boarding". So in effect you are being charged for having your bag with you. I am a regular traveller so don't take hold luggage to avoid the waiting at the destination. The small bag allocation is insufficient so I rely on the hand luggage. There is a hand luggage locker for every seat on the plane so how can they justify "first 60 only"? Ryanair shareholder please note if there is an alternative to Ryanair then that's still the one I choose!
## 1770 I fly with Ryanair about 20 times a year. They are consistently reliable and punctual. The only time they let me down was when the ash cloud happened. The prices are fantastic but you have to be flexible to get the best deals. They are not BA but you need the mind set that it is like catching a train and do not expect luxury. But it means I visit my house in Portugal regularly and often pay more for the car parking than the flight.
## 1771 Flying London Gatwick to Shannon in Ireland. No problems but not a cheap flight for a flight that only took an hour. Cheaper to fly to Malaga with a different low cost airline when you take into account the cost of hold luggage. Saying that we would probably use them again as we liked Shannon Airport. If you have to wait at Shannon find the brilliant viewing area on the third floor with free WiFi.
## 1772 Flew Shannon-Poitiers-Stansted-Shannon. All flights were late leaving but made up time except for the Poitiers- Stansted leg which was delayed by 1 hour due to a passenger injury at boarding time. My only gripe is that I had booked a Shannon-Nantes flight and Hertz car hire in January. Ryanair cancelled the Nantes fight in May offering a flight to Poitiers or money back. Transfer went very smoothly. However Hertz told me that they did not have an office in Poitiers and my only option was to cancel which I did only to be charged a 50 euro cancellation fee even though I had booked through Ryanair. Small print and all that. Ryanair flights were excellent with very friendly and helpful staff.
## 1773 Took flights as a family of 4 2 adults 2 children Stansted to Alicante and back. First time taking hand luggage only with Ryanair (used easyjet in May) and as Ryanair now allow your handbag too it has made the whole process much easier. I would put them above Easjet for that fact alone. Had a lovely Spanish crew on the return journey and the flight arrived slightly ahead of schedule. As others have said as long as you follow their strict rules on baggage and boarding passes there should not be a problem. I booked priority boarding for both journeys as it helps with the children to not have too long a queue and sort out seats and luggage before the plane becomes packed.
## 1774 Dortmund-Krakow RTN. Avoided Ryanair because of their aggressive policy but decided to give them a try again. Finally Ryanair has understood that free seating leading to a scrum has had its longest time. The allocated seating for decent fees is a big improvement. Onboard only harassed once for a lottery. No constant announcements for buying this and that anymore. Leg room stays a problem though as they press 198 passengers into a Boeing 737-800. Wouldn't bear a FR-flight longer than two hours. All in all a decent experience for less than 200 euro rtn for two including bag priority boarding - worked well but isn't really necessary anymore with allocated seating - and reserved seat. If you reserve a seat at the time of booking you can can check in 30 days prior to departure. Well worth the extra fee for people who complain they can't print their boarding passes while being away from home.
## 1775 Return flight from Palma to Stansted on 7th Aug 2014. Arriving at the airport we went through the check-in etc and proceeded to departure to then be told the flight was delayed. Then for almost 2/3 hrs we were told different stories about what was happening. It turned out that the plane required full checks before flying why oh why couldn't we have had the truth up front. We were herded together like cattle in departure with no air conditioning no drinks were offered for the children until just as we boarded. On the positive our hold case was brought through to us so my husband could get his medication. In fairness my husband and I were assisted by a lovely lady who fast tracked us through as we were both struggling with the long walk and queues through the checks both having mobility problems. She was so kind and wasn't asked to help lovely to see that there is someone willing to go the extra mile.
## 1776 Flew Edin-Malta-Edin with my 5 year old son for 7 days and so was unable to print off return boarding pass before arriving in Malta. There are no internet cafes in Sliema Malta so thought would print off boarding pass at machine at the airport. On arriving at Malta airport 2 hours 20 minutes before my flight a particularly grumpy Ryanair agent took up 10 minutes of my time telling me I was too late and should have done this in Malta (How exactly if there are no internet cafes and you do not stay in a hotel?) before finally pointing me towards the computer where I could do this. This touchscreen computer was slow and unresponsive and so I was 2 minutes late to meet the 2 hour deadline because of this woman's complete lack of customer service. An EUR 140 fee and a horrible stressful end to the holiday. What gets me is that I knew I had to print the boarding pass off 2 hours before and made a fair effort to do so leaving 20 minutes to do this on arrival at the airport. I noticed Lufthansa had dedicated machines clearly visible for this purpose. I had to beg this woman to tell me where was the Ryan Air machine before she pointed it out to me all the while telling me I was too late etc when I still had time. However reading other reviews it looks as if even if I had been at the airport much earlier that the fee might still have been charged. I am sure they can afford to install these with all the EUR 70 fees they have been stashing away this summer.
## 1777 I paid for a flight from Madrid to Beauvais. My apartment in Madrid did not have internet access so I could not access their website nor print the Boarding Pass. I did not think this was a major problem since all airlines have entry stations to get answers to problems and obtain Boarding Passes. Ryanair charged me $168 and made me go through two very long lines. This was in addition to the cost of the flight. And the cost of a glass of water was 3 Euros! Customer service was miserable: long lines no information just shut up and move along. Avoid this airline!
## 1778 Friday flight 1/8 from Stansted to Dublin - 8.30pm. Flight arrived on time. Had to sit with a rather large gentleman in the middle who hogged the space. Held up due to Stansted taking their time getting paperwork signed and chatting with pilot and crew - no rush for Stansted then. Don't know why people complain about the plane/the colours of it or the seats or the printing off of own ticket. Also don't understand why people cannot read the bit that says - front entrance of plane or rear entrance. Surely to goodness they can all read. Flight on time job done as usual.
## 1779 Have flown with Ryanair on numerous occasions across Europe and in 20+ flights have never had a problem. You get what you pay for and as long as you read the small print and stick to their rules you can't go far wrong. My wife and I even used them on our honeymoon! It's worth doing your revision before you fly and check on destination airports and onward travel links on your arrival as some Ryanair destination airports can be a little out of the way. Overall though I have no reservations in using Ryanair.
## 1780 2/7/2014 Perpignan to Birmingham flight FR 1999. Travel with Ryanair several times a year and I have never had any problems. I abide by the rules and ensure hand luggage is the correct size and weight. Love it that seats are allocated before you fly now and that I no longer have to squash my handbag in my case to board. I print my return boarding pass in my resort so no problem.
## 1781 Stansted to La Rochelle. Got to airport around 3 hours before departure and as we had no baggage we went through security. Security took 27 mins. Unacceptable. Then we waited for around for 90 mins before flight was called and we went to gate 44 immediately. As being called 40 mins before and getting to gate 35 mins before we thought the plane would be there in 10 mins. It wasn't and was there no earlier than 25 mins of waiting at the gate. We were rushed on to the steps to Tarmac whist pax where deboarding and we where on it around 3 mins before our scheduled departure time. We where off 15 mins behind schedule. The flight was smooth and fine. I had a Pepsi and just looked out of the window no IFE or food. We sat in row 5 and had priority boarding. The aircraft landed 10 mins early and we had the usual fanfare. We where de boarded quickly and went straight through to meet relatives who have a 2nd home and took our bags with them. La Rochelle to Stansted. We got there 2 hours 15 mins before flight and we went through security. Relatives driving back took bags with them. There is 1 duty free shop and a cafe. There where 2 aircraft departing at same time and being the first in the lounge gets us a seat. (La Rochelle gets overcrowded). The aircraft got in 10 mins early but the other Brussels flight was late. Boarding began 10 mins before departure and we where off just after the Brussels 15 mins behind. The flight was ok. My seat was dirty and had gum under the seat in front. Again row 5 and priority boarding. We landed 2 mins behind and Ryanair were not sneaky and didn't do the fanfare we were out of Stansted in 25 mins.
## 1782 FR3872 from East Midlands to Pula on 24th July 2014. We return on 31st July. I was unable to print off boarding passes at home I had to do it at the airport using Ryanairs computerised screens. This cost \302\243210 for three people. Why? I could understand paying \302\24310 but why on earth \302\24370? That's typical money grabbing Ryanair. As usual the announcements at the gate and in the plane were so rushed that it was impossible to hear all that was said. Ryanair may be cheap but I'm a human being and expect to be treated with civility and fairness.
## 1783 I had a \342\200\234neutral\342\200\235 flying experience with Ryanair (July 2014). This was a real surprise. I see that the staff have new marching orders and that intimidation is no longer the order of the day. This new more normal\342\200\235attitude is already being noticed. Passengers are already taking liberties with hand luggage it will probably not be long before a new clampdown\342\200\235 will be enforced and unpleasant situations will once again be splattered all over the review sites. I made sure I had ticked all the boxes and weighed in before travelling this time. My previous experience has made me paranoid\342\200\235about using this airline. I would have preferred not to have used Ryanair. They offered the best price for the trip and as money is tight I was compelled to take the risk. We can remain optimistic and hope they carry on in this manner. Perhaps in 3 to 5 years they will have a positive reputation. I still have reservations Ryanair inflicted such needless blow to my family that I am afraid to say it will never be forgiven. In the meantime I will reluctantly use the airline when needed and hope for more uneventful flights.
## 1784 High expectations? No. From the outside the plane looks modern and fully equipped for a flight but no no no. The inside faded yellow overhead compartments torn leather and faded blue seats no inflight entertainment whatsoever. In fact the planes are in such bad condition and poorly equipped there's not even a pocket in front for you to put a magazine or something all of your safety notices are printed on the back of the chair in front which means you have to amuse yourself with possibly scenarios throughout flight just by looking at it. I used to think easyjet was the lowest quality airline but Ryanair that sets a new low. The staff unhelpful unfriendly didn't crack a smile the whole flight.
## 1785 I have travelled many times with Ryanair and never had problems. If you keep to the terms and conditions on the web site you have no problems. Ryanair are the cheapest and best of low cost airlines.
## 1786 CLR-AGP-CLR. Boarding on time departure with 10 minutes delay. Plane's a Boeing 737-800. Cabin crew professional but a bit cold. Snacks were expensive but are not necessary. Seats are comfortable but the pitch is bad. Temperature too high in the cabin. Arrival 20 minutes before the scheduled time. Value for money is good.
## 1787 Flew from Glasgow to Majorca with cabin bags no problem. Flight was fine even arrived early which was a bonus. Not so on the way home. One of the women grabbed the bag off my 17 year old son and made a big show of how the bag would not fit in the cage. The bag was actually smaller than Ryanair's specifications but the wheels were slightly sticking out. People with larger bags were being let through but she refused to let us through without paying 50 euro.
## 1788 Excellent flights from Liverpool to Malaga and the return flight. No problems or delays and staff were excellent. Staff dealt with any issues on board professionally and in an excellent manner. It is all to easy to complain when things go wrong and rightly so however we do not praise when things are achieved above and beyond the call of duty. I have travelled with Ryanair previously with the same results. Excellent service.
## 1789 Flew with my 8 month pregnant daughter who had required doctor signed Ryanair paperwork which she was never asked to show. Had just cabin bags on the outbound flight but with family bought baby presents on the return it required a case being put in the hold. Getting assistance to do this from the Ryanair desk staff was like "pulling teeth". Dismissive unhelpful arrogant and rude summed up by the comment from one Ryanair staff member with the statement "I can't be out here just helping one member of the public". I enquired what was the minimum number she could help? Priority booked and seats reserved only to be herded from one queue at the gate to the next queue at the entrance of the air bridge then on to the queue at the aircraft doorway 20 minutes standing during intense summer heat. Not the sort of treatment to subject an expectant mother to. Not one member of staff took the care or comfort of this pregnant lady into account. The only smile came from cabin crew when trying to sell their overpriced beverages. An appalling airline worthy of their reputation of flying their customer in "Cattle Class".
## 1790 Excellent support yesterday from Ryanair in Liverpool. My 13yr old son travelled to Knock from Liverpool with my brother and his son. My brother made his reservation in Ireland I arranged my sons ticket here in UK. When I tried to check him in I was not permitted because he was born in 2000 therefore too young to fly alone. I travelled with him to Liverpool airport expecting a \302\24370 levy as he was not checked in online. I explained he would be travelling with my brother and his son he would not be alone - and the young lady was most understanding and checked him in immediately with no quibble or charge - really good service.
## 1791 After an accident just prior to making my return journey I was unable to walk. As soon as the Ryanair rep at the airport saw me she arranged for a wheelchair and I was delivered to the departure gate and helped onto the plane. During the flight the crew supplied me with a folding wheelchair and pushed me to the toilets moved my seat so that I had room to rest my leg on the food table and bought me a bag of ice to help the swelling in my leg. I cannot praise them enough.
## 1792 Our family (2 adults + 2 Children) travelled TMP-HHN 11 July and HHN-TMP 18 July. We were a bit worried about taking Ryanair (due to all negative feedback about this airline). However everything about our trips were working 100%. Check-in ok! Both flights ~20min early FA's had a professional attitude not "pushy" in their efforts to sell "stuff" at all.
## 1793 BHX-DUB-BHX. Flawless flights. All on time with an excellent turnaround time. Cabin clean with polite crew cost 16GBP return. Only hand-luggage printed boarding card and had luggage with me in cabin. Half price hot meals on last evening flight back. As long as you follow the rules you cannot go wrong.
## 1794 I frequently travel with Ryanair on the STN-NYO route and it normally works well. I have always been able to take my hand luggage in the correct size bag on board without any problems. Today however I was waiting to board the flight at Skavsta Airport when then airport staff start walking along the line of people waiting and randomly telling passengers the flight was full and the had to put their hand luggage in the main hold. When I pointed out that I had some breakable goods in my bag I was told that if I was that worried I should had been in the queue earlier. As it happened There were about 10 people in the non-priority queue ahead of me. Also my travel companion was at the end of the queue but was allowed to take his bag same size as mine on board without problems. There was no logic at all. TO me it seems like the only way to guarantee that you can bring your hand luggage on board is to pay the "priority boarding" fee. Not sure if this happens on other Ryanair routes but the same thing happened to my daughters also at Skavsta a couple of weeks ago. Is this another sneaky way to make money?
## 1795 Having been put off using Ryanair about 4 years ago I took a flight from Bristol to Girona and return early July 2014. I was well aware of all the pitfalls and extra charges and then made the mistake of mis-spelling my own first name. I thought 'here we go' especially as I couldn't get through on the phone even the \302\2431.09 a minute line. Then I stumbled upon their 'live chat' facility got connected within 2 minutes and had the name corrected. They emailed me a revised confirmation. Of the flights - well the pre-allocated seats are a great improvement - saves that awful scramble on board with the FAs screaming 'if you don't sit down we'll lose our flight slot' and passengers coming to blows. The boarding pass saying front or rear of the plane is sensible. Unlike previous flights (which was what finally put me off Ryanair) there were no cases either at BRS or GRO of passengers being harassed having their luggage weighed or measured or any sign of people being charged for things. Most notably I didn't hear any passengers grumbling about anything. So the simple impression of just 2 flights is that you get what you pay for on-time clean planes and a vast improvement from 4 (plus) years ago. Whether I want to brave a STN flight is debatable but I need to fly home later in the year and I won't be too worried.
## 1796 Edinburgh to Arrecife 6/7/14. Crew outbound were very depressed couldn't hear them speaking on the announcement and they were French which made hard to understand them but they did speak English we felt rushed during boarding as the crew kept announcing "good morning please can you store your hand luggage and take your seat as quickly as possible" this was said 4 times! Overall early departure and arrival which makes it better! Nothing was a problem but the crew were very shy! Arrecife to Edinburgh 13/7/14. Crew inbound were really nice my niece got welcomed specially by the two crew boarding us at the door. They were lovely. Once it came to the lottery cards they made it into a laugh which made the flight more welcoming. This was just an opportunity to get rid of your euro coins and to be charitable. Overall smooth flight and arrived very early. Just remember this is a low cost airline and remember to print all your boarding pass off before you depart like we did!
## 1797 June 23 Brussels to Palma de Mallorca. Check-in online and boarding passes already printed baggage respected Ryanair's rules so fast and smooth drop-off two hours before departure. Automatic seat allocation is a good improvement don't need to stay in line for boarding despite the fact the flight was almost full. Short walk from the gate to the plane (for me was nice). On-time boarding 30 mins. late departure due the long queue for take- off. Some turbulence during the flight and a bit bumpy landing. The plane was clean and the crew was polite. In Palma fast luggage on belt. Good value for money.
## 1798 Tenerife South to Manchester 15/07/14. Great value flight. 35 mins early much better than Monarch's time keeping. Friendly service and much less announcements. Really starting to notice the changes.
## 1799 I recently flew Ryanair between BCN to SVQ and I had a really pleasant flight. Temperature inside the cabin was perfect and seats comfortable. Space between seats was adequate. Crew were very friendly on both flights. I also appreciated the changes of the new Ryanair with seat assignments and with the automatic priority boarding if you buy one seat when booking. I will recommend Ryanair and fly them again.
## 1800 Outward flight Stansted to Pisa one hour delay very cramped seats I am only 5' 8'' tall ventilation blew very hot air out for a considerable part of the journey. Return from Pisa on July 12th a 5 hour delay no reason given as to why no vouchers offered no compensation mentioned sat for 45 minutes on the tarmac before taking off delay at Stansted getting off the darn plane at 02.15 as only one set of steps could be found. A complete and utter shambles if you have a choice do not fly with them.
## 1801 Flew 05/06/14 STN to SNN. Had a horrible start to my journey thanks to the Stansted Express service on which I was stuck for 2 hours due to technical difficulties. Missed my flight as a result and Ryanair transferred me free of charge to the next flight which was the following morning. Very much appreciated considering it was not their fault I missed the flight. I needed to make it back to Shannon for a trans-atlantic flight the following afternoon so they saved my holiday from being cancelled. This along with the various upgrades to their service in the past 12 months (additional carry on bag reserved seating etc) have made Ryanair my choice of airline when flying from London. Customer service is dramatically improving in my opinion and as long as you know how they operate and how the pricing structure works then there shouldn't be any issues when flying with them. I'm not sure how so many people are allowed to leave bad reviews on here when the source of their problem is very often the customer being at fault and not adhering to the "rules of low-cost flying"!
## 1802 We went with 6 people (4 adults and 2 children). We accidentally had two pieces of luggage too much (this was our own fault) so we paid the extra other airlines do the same so its not just Ryanair. Boarding was very smooth and the children received special attention from a friendly crew member. Plane landed on time in Rome. Return was about the same. I fly regularly with Ryanair and I never had any problems. Delays are hardly the mistake of the airline but of the airport and the airport handling so you cannot blame them for that. Also people flying with Ryanair don't want to pay much for their tickets but they complain about the people paying the extras like priority boarding. Some passengers not paying for the extras were complaining why we could get on first! Also if you preselect your seat with a small extra you can print your boarding pass (also for the return flight) at home. Even with all the extras Ryanair was the cheapest solution. So to be frankly not Ryanair is the problem but some people flying with Ryanair are. Ryanair is very clear about their rules and I really don't understand why people don't obbey them? Do they do it on purpose maybe hoping they get the full service and not paying for it? I like Ryanair they bring you very safely from A to B for very little money. I don't expect much from them but I am always surprised they give good service for the money you pay.
## 1803 Manchester-Tenerife-Manchester. Out 20/6 returned 27/6. Good flights crew very friendly. Plane on time both ways in fact landed 25 minutes early on return. Only problem we had to wait for one hour for our cases to come off in Manchester. Shame really I hope Manchester airport gets this issue sorted soon.
## 1804 We travelled from Stansted to Madrid for a week arriving in good time with cabin baggage only. I asked for information on the route after none was given and was told "we have just passed Stuttgart and will soon enter Swiss airspace." On the return I again asked and no information was offered. We passed some marvellous scenery and it would have been helpful to pass the time if we had been told. This used to be standard procedure but now the main interest seems to be in selling as much as possible. Perhaps the pilot did not know where we were going.
## 1805 Flew on 16th June Paphos to Athens. Followed the rules and had no problems whatsoever. Ground staff in Paphos were extremely helpful and professional. Flight was exactly what I paid for nothing spectacular but absolutely nothing wrong. The only thing was having to wait in those dreaded boarding cages in Paphos. Otherwise all round decent flights with no issues.
## 1806 On a flight to to Eindhoven from Dublin on 27/6/2014 the plane pushed back from the terminal and 5 mins later we were informed of a technical problem. We returned to the stand whilst the fault was investigated. Eventually we were told that the problem could not be fixed and another aircraft was being prepared. We eventually got on our way about 2.5 hours late. On the return journey on 30/6/2014 exactly the same thing happened. The plane pushed back and then we were informed of technical problems. We returned to the stand and the fault was investigated. After about an hour we were told that the problem was solved and we got on our way. On the first flight we were told we could not use the toilets whilst waiting for the fault to be found. After numerous complaints the staff gave in and allowed us to use the toilet at the rear of the aircraft.
## 1807 East Midlands to Faro and return. Have flown many times with Ryanair both on business and for leisure. Only ever had one serious delay. Both flights were ok. Return flight delayed by 10 minutes with limited catering due to knock on effect of strike in France. Staff apologised for this with clear explanation as to reason. Staff on both flights very pleasant. British Airways should teach their business class stewards to give a genuine smile like this. With regards to complaints about add on charges. Read their terms before you book. Everything is made clear on their website. A bonus with Ryanair is no reclining seats. Why do you need to recline your seat on short haul restricting leg room for those behind you.
## 1808 Round trip Kaunas (KUN) - London Gatwick (LGW) - Kaunas (KUN). Friendly staff flight with no errors or other shenanigans. Not much space to move around in the plane itself but acceptable for short haul flights. One disadvantage - everything costs money. I'm surprised they still don't charge for bathroom trips. Of course you can only expect so much from a low price airline which is the main advantage. Another thing is the flight attendants trying to sell lottery tickets and calendars that is rather unprofessional feels like you're in a market or someplace similar. All in all - loved the flight and definitely going to use this airline again!
## 1809 If anyone is every considering flying with Ryanair ensure you know exactly what experience you are signing up for when you book your ticket. We went return from Luton to Marrakech and would not do this journey with them again. In fact we'd only think about it for very short flights for weekend breaks and to be honest that would be pretty desperate. Where to start? They may offer cheaper "upfront" costs but add-ons are extortionate. The fact you cannot print off your return boarding pass within 7 days of your return flight is just a way to con people out of the money (\302\24310 per person) to advance purchase a designated seat. After all who wants to gallivant around an unfamiliar foreign city looking for an internet cafe that may or may not have a printer. The queuing is still a scrum even though they have finally realised that assigning people seats will stop the kind of behaviour they and their ilk were responsible for creating. On the flight the whole experience is stuffy cramped and bad tempered. The hard-sell starts instantly and continues through the whole flight. The claustrophobic atmosphere is taken further by the fact that some aisles didn't even have windows! They couldn't even be bothered to give out landing cards either which just prolonged the bad experience at the airport. I reckon that after all the add-ons it would have been cheaper to fly with BA. Although BA are pretty woeful 3.5 hours on a Ryanair flight is far too much.
## 1810 Faro to Bristol. Crew were most welcoming whilst boarding with plenty of smiles and interaction. We had to wait whilst an elderly couple were late due to them going to the wrong Gate they were frail and agitated on boarding. The crew were marvellous with them even the Captain emerged from the cockpit to greet them calming them and telling them not to worry. Despite this we left early and a smooth flight got us into Bristol ahead of schedule. Well done Ryanair!
## 1811 Flew Manchester-Gran Canaria. Good flight times and got baggage quickly. Attempting to print off the boarding pass scam was painful to say the least. In the UK the site kept crashing and took the best part of a day to achieve the process only to have to repeat this in our holiday destination. When at Manchester airport it was displayed that boarding for our flight was in 5 minutes this continued for about 25 minutes with no updates. We were then requested to proceed to boarding that I can only explain as a cattle market. We were then left to wait in the queue for the best part of another 45 minutes. Consequently our flight was delayed by well over an hour with no explanation or apology. Whilst on the flight to Gran Canaria the seat belt sign light was displayed intermittently for long periods with no evidence of turbulence or explanation. Being 2 adults we could manage this but we had to feel for the passengers with young children who desperately wanted the toilet. Baggage - the allowance is 15 kilos for hold luggage and 10 for hand luggage. When we flew out from Manchester they counted hand luggage in our allowance. On return from Gran Canaria they decided that hold luggage should only be 15 kilos. Our hold luggage weighed exactly the same as it did at Manchester and we did not have hand luggage but were told that it would cost us 70 euros to pay the excess. Having very little hand luggage facilities available we had to empty our case to avoid the excess charge. Admittedly we should have read the small print but one would question why this was not highlighted in Manchester and came to light in Gran Canaria on our return. Overall it may be a budget airline but really not worth the hassle.
## 1812 We travelled twice with Ryanair during the last week. The first trip (Stansted to Pisa) was delayed 45 minutes. Its not so much the delay that's the problem it is the total lack of communication or an apology for the late running. We were asked to queue up for boarding and stood there for over an hour with no communication. Worse was to follow. On the following Saturday we were booked on the 22.00 flight out of Pisa for Stansted. Again no communication or apologies were forthcoming from Ryanair. 150 minutes after the flight should have left we were told it was cancelled - no apology again. We were not offered any refreshment during this three hours. They then booked the passengers a hotel but had only a mini bus to start with to take 16 passengers a time randomly selected by Ryanair staff. We eventually arrived at the hotel at 03.00 but had to be up for an 07.00 departure from the hotel. No food or drinks were offered by Ryanair. No staff were available at Pisa airport to speak to or to hand out vouchers. The service was shabby at best. No apologies poor communication no-one to talk too and no refreshment vouchers either. We will not be travelling with Ryanair again.
## 1813 Having not used Ryanair for years due to loading issues now you can book your seats and pay for priority boarding thought I would try them again. Flew Malaga to Ibiza return fantastic staff marked off first 90 customers who could take on board cabin luggage no standing in a queue you just walk up to the priority line when suits. On our return just sat there until the last few loaded in row 8 plenty of overhead cabin space as again only first 90 allowed on board. Whilst both flights full the final 90 or so passengers loaded fast as they had no luggage. There was a few complaints by those not allowed cabin luggage especially when we walked up at the last minute with our hand luggage. All in all from booking to in flight very good shame you don't have the seat space on our normal Jet2 flights.
## 1814 Dublin to Malaga 28th April 2014. Malaga to Dublin 26th May 2014. At the boarding gate travelling from Dublin to Malaga and Malaga to Dublin as I do very often passengers have now started to leave their bags in a line at the boarding gate then go and take a seat. This books them a place in the queue without themselves queuing it happens in both the priority and other queue. I thought that bags were not to be left unattended anyone could leave a bag and wander off - needs to be stopped before everyone decides to put a bag down in the bag queue and then take a seat.
## 1815 I flew for the 1st time with Ryanair on 31st May. On board was a very rowdy stag party that were dancing and singing in the aisles and were very annoying. The staff remained professional and eventually got the party to sit down. I think if you turn up on time don't go over your baggage allowance and have the correct paperwork then Ryanair is as good as any other airline. On our return flight we had a 30 minute delay but the staff boarded us quickly and efficiently. Will use again.
## 1816 Flew as a family of four from Brussels to Manchester and back. No problems at all. Paid for specific seats so was able to print out all boarding passes in advance; used their parking offer at Brussels and we were in the departure area 10 minutes later. Both flights short and timely and with hand luggage only we had no delays at all. Pleasant crew on both flights. For the price excellent just wonder what they do when things go wrong?
## 1817 EDI-DUB. Utterly painful booking process on their web site which is not exactly user friendly. Flight experience was much better. Paid extra for seat at front of the aircraft and travelling with hand baggage only. Flight left on time but was late getting in as we had to do a go-around due to an aircraft in front of us in the landing queue being too slow.
## 1818 Flew out to Majorca from East Midlands on 24th May returned on 7th June to East Midlands flight should have left on 24th May at 11.35 departed at 12.05 due to I think a seating problem. Seems 2 sets of people had been allocated same seats I think the problem could have been solved earlier as 2 people boarded flight some 20/25 mins. After flight should have left. We had a great flight home arrived a little earlier that was spoiled by having to walk 300/400 yards to passport control in pouring rain. Everyone was sopping wet by the time we got there very shoddy service at East Midlands.
## 1819 I have flown with Ryanair in the last 6years from Liverpool to Carcassonne many times and have found that they are 99.99% punctual except when there is a natural disaster i.e.volcanic eruptions French air traffic strikes and the like and yes they will charge extra if you don't read the small print and it is not the most comfortable but isn't that why they are cheap you try and fly to some remote airport in Europe using a well known carrier and it will take three days to get there and cost you a lottery win to get to your destination so put up with a little bit of rude service and an uncomfortable seat for a few hours and get over it.
## 1820 I am a regular user of Ryanair and I have always defended them as an airline with their rules my line would be stick to the rules and it's a cheap way to fly. I've never had a problem until now the new 7 day rule for printing off the boarding card is downright wrong. We hardly ever go away for less than ten days so we can't book our return flight in England. We go to rural Spain and I doubt we will find an Internet cafe now when everyone has wifi and Ipads I think they have all closed down. So now will have to pay for allocated seats and need to remember this when working out whether Ryanair are cheaper than Monarch.
## 1821 I recently flew from Limoges to Stansted on a Sunday. I tried to book in by computer but the page would not accept my information. I tried phoning the help number but found they did not work weekends. When I arrived at the airport I was charged the extra 70 euros. What would have been a cheap flight worked out to be very expensive. Why is it one has to book-in twice? Once on the computer and once at the airport? Oh of course silly me. They make more money this way. I have used the Dinard-Stanstead route many times and found it quite useful and cheap but this double booking is just a rip-off. It's supposed to be cheap but I've actually worked out I can do it for the same price on another airline. And how can I avoid paying for their insurance? Another rip-off.
## 1822 I flew from Shannon to Nice in May on Ryanair's new route. The flight schedule was excellent as it left around ten am. I was in Nice by 2pm. (local time.). The flight was comfortable the price was right but for me the best thing was being allocated a seat for my flight. Being allowed to have my hand bag with me was also a bonus. Long may this route continue!
## 1823 We travelled with Ryanair in May to Menorca. We had no problems at all the staff were all very friendly and helpful. Will go with Ryanair again later this year.
## 1824 DUB-STN and then STN-SVQ a couple of days later. Effortless flying really just a gripe with the horrendous food you have to buy (obviously you don't have to). Had something that was meant to be fresh but had a best before of July 15. The cabin crew never look happy and were nice to the pax but not so much to each other.
## 1825 Travelled LPL-LDY with a 3 year old. No complaints at all. With Ryanair know the rules and play by them and its no problem at all. Assigned seating is a huge improvement and the website is better than it was. I travel this route frequently and the punctuality is very good.
## 1826 I've flown a lot over the past decade but have never used Ryanair. The first time was a return trip from London Stansted to Santander in May 2014 (FR2612 / FR2613). Despite worries about Ryanair's reputation it was a very positive experience. The flights including 15 kg of baggage and all extras were very reasonably priced. Both outward and return flights landed a few minutes. Return leg saw us being placed in emergency exit seats rather than our allocated seats which meant extra legroom. Cabin was clean. Seats don't recline but were fine. By following all Ryanair's instructions (printing boarding passes etc.) no extra money had to be paid. Would happily use them again in the future.
## 1827 I travelled from London to Oslo. The flight arrived early staff were respectful and the plane was clean and comfortable. Would definitely travel on Ryanair again.
## 1828 We flew from Pisa to Barcelona the inflight staff were nice but the ones at the airport were horrible and rude. By the time you add in all the extra costs it is no longer a deal.
## 1829 Flew Glasgow Prestwick to Lanzarote on 28th April no problems at all knew we had 2 print the boarding passes though why anyone can say they didn't know they had to do this amazes me. Our hotel kindly printed the return passes for us but there were plenty of internet cafes around so it would have been simple for us to do this ourselves. Have booked flights to Mallorca for August at a great price and I'm sure I will have the same relaxing time if people keep within the rules then all will be ok.
## 1830 Liverpool to Limoges out and Limoges to East Midlands in. No problems. Ryanair do just what they say transport people who want to travel at an economical price and get them from A to B. I'm a regular user on this route and never yet had a problem. Eat before you get to the airport make sure your bag fits in the frame as soon as you arrive at the airport and your chances of a nasty surprise are minimised. I'm not certain I'd recommend them for family fully laden holiday travel but for one guy alone with minimal baggage it's a great way to travel cheaply. - I'm satisfied.
## 1831 My husband and I fly Ryanair about 4 times a year we have no problems with them at all. Providing you know the t&cs and abide by them. People who moan about boarding pass issues mostly only have themselves to blame. As to people who moan about the on time fanfare they really need to get a grip it last about two seconds live with it! In February we were unable to land at East Midlands because of high winds and were diverted to Birmingham. We found Ryanair to be very organised coaches waiting and back to East Midlands in no time. I do admit that the new timings regarding printing of boarding passes is a pain but for goodness sake pay an extra \302\24310 and print your return passes before you go away.
## 1832 The flight times from Birmingham to Barcelona worked out along with the cost of the flights and having recently seen Ryanair's marketing campaign to make themselves more customer friendly we felt it was time to try them again. I made the mistake of not checking in online which I realised was against company policy and by the time I had tried to do this the two hour curfew was on and I couldn't do it. This meant checking in at the airport for the sum of \302\24370 per head (\302\243140 in total) for myself and my wife. I completely understand the argument of a web based airline and would expect to have to pay extra for the privilege but those sort of charges are punitive and unfortunately destroy the more customer focused marketing approach Ryanair are trying - a shame!
## 1833 Bologna-Bristol-Bologna. New route with exceptional fares. Ryanair at its best flights on time and no fuss travel from A to B. Crew were great but on the return were particularly polite and professional. The allowance of a small extra bag makes a big difference. I hope they make a go of this new route.
## 1834 Flying about 4 times a year to Spain this year I checked out Ryanair flights which were a little cheaper. so went with them. Unfortunately the 3 flights booked have all been changed some by just a few hours but on one in particular leaves me with a loss of almost a days holiday.
## 1835 After paying to reserve a window seat on my flight to Palma Mallorca on 10 May 2014 I was horrified to find that my seat 11A did not have a window at all. There was nothing on the aircraft plan to show that there was a bulkhead where a window should be. I did not see a thing for the duration of the flight which was annoying to say the least as my wife and I enjoy looking down on the view below.
## 1836 Prestwick to Gran Canaria return. Both flights on time did pay for extra legroom worth the money for a 4 hour flight. Had our cabin baggage removed at Prestwick as they had passed their 90 bag rule staff ensured personal items (passports money etc) were removed. On return we were allowed them in the cabin. Very overpriced onboard product but if you don't want to buy it then don't. Staff friendly.
## 1837 This stupid 7 day check in was not highlighted when I purchased the flights. My wife and I had to travel a day ahead of our due flight time and could not print off our return tickets. Oour Spanish holiday was spent in the mountains with no facility to access a computer. I rang their customer care line and emailed 4 times asking for help - no reply to either request. I was left with no option than to pay \302\24340 extra to check in. This is my first and last booking with this company.
## 1838 Use of Ryanair is generally a last resort. Flight last Friday from Treviso to Bristol was due to take off at 15:20 but about 30mins beforehand a small storm arrived with torrential rain and lightning meant there was likely to be some delay. However passengers were still gathered around the very small and enclosed gate area as normal and only at departure time was the board updated to show an hour delay. Everyone including several disabled passengers in wheelchairs stayed expecting aircraft arrival and loading as indicated. The storm had passed and other aircraft were moving. No further updates were given and an hour later a further hour delay was updated on the gate display. With no seating for most passengers no refreshments and no information people were becoming unhappy especially as another delayed flight were packed into the same space. When the third hour delay was put up on the display it was accompanied by advice notices for passengers advising of EU travel rights! When the plane eventually arrived just before the third hour of delay and passengers allowed to board the crew were more concerned with making sure we were aware they were due to be off duty soon - no word of any apology for delay from anyone. Part way into the flight back it was then announced the crew was at their limit of allowed flight time and we would be diverted into Brussels for a new crew to board. On landing no crew but another hour wait for them to be roused from homes to take over the flight. Why the operations staff did not allow for this originally is not known! Eventually arrived back in Bristol over four hours late. Needless to say will not be rushing to use Ryanair again anytime soon!
## 1839 I was warned by several family members to not fly with Ryanair but the flight I wanted with my friends was cheap so I didn't mind so much. I'm usually a very easy going person but Ryanair make my blood boil! They changed my flight time by more than 8 hours meaning that I would lose a day on my holiday I applied for a refund as did my three other friends for the coming home flight (We rebooked another coming home flight for a few days later with Ryanair) All of my friends got their refund however Ryanair refused to give me mine! They said that I cannot just refund one leg of the journey. Eventually they said they would refund it 3 months later and I'm still waiting for money to be put back into my account. I highly recommend you don't put yourself in this kind of position to be tricked out of your money.
## 1840 Stansted to Budapest return. Both flights left a few minutes late and arrived almost on time. Cabin crew worked hard seats were not too uncomfortable. By following the rules we purchased and paid nothing additional - hence it was great value. The new seven day check-in rule is a bit of a pain because it applies for each leg of the trip separately. So (seven days in advance) we had to check in for the flight out on the 12th May and for the flight back on the 14th. It would be nice to be able to do them both on the same outward day.
## 1841 Pre-paid for seats as we were travelling with a 4 year old and needed to sit with her at Stansted they called Priority and Pre Booked seats on first on returning from Perpignan they did not call pre booked seats. On checking our tickets we noticed a * against Other Queue - does this mean you have paid for pre-booked seats? Neither ground or aircrew knew what it means!
## 1842 Ryanair's business model appears to me to revolve around cheap ticket pricing with highly complicated and rigid terms and conditions which the majority of people will fall foul of thus allowing Ryanair to introduce additional costs hence restoring their profits. Placed a booking Ryanair changed the rules between the time I placed my booking and date of flying which meant they expect me to receive return flight boarding cards by email whilst on holiday and then try to get the hotel to print them out for me. There are too many ifs buts and maybes in that scenario so alternatively - pay 13 per person to be able to print boarding cards before we leave the UK.
## 1843 We (myself my wife and our two sons) booked flight FR 8412 months in advance from Milan Bergamo to Budapest on April 29 2014. We checked and confirmed the flight status on the Ryanair website the night before the flight. We got an email from Ryanair a few hours before departure saying the flight had been cancelled without stating any reason whatsoever. We tried calling the Ryanair hotline to no avail. We checked the Ryanair website and called Bergamo airport to check if there were other Ryanair flights to Budapest as we had a pre-paid rooms that night in a Budapest hotel and definitely had to be there the next morning a the very latest. There were no flights on the same day or the following day from any Milan airport. We had to commute to Milan Malpensa to buy expensive alternate flights to Budapest with an overnight connection at Warsaw. Ryanair is an absolute nightmare of an airline. An utter waste of time and money and the absolute pits in customer service. We will never book it again. Our travel insurance will not fully cover all the expenses we were constrained to incur because of this cancelled flight. Please spare yourselves the aggravation.
## 1844 Me and 5 other girls flew Ryanair from Manchester to Tenerife and back again on May 9th 2014. Overall not too bad I guess for a budget airline but the new introduction of the 7 day boarding pass malarkey meant we were stung on the return flight for 70 euros. As this is on the return flight we had obviously spent up and had to contact one of the groups husbands to ask if we cold charge to his credit card to get us home. At no point was this new procedure explained to us (and yes I appreciate it is probably in the very small print but if you are a regular flyer with Ryanair (which the girl who booked was) you would expect something like this to at least be mentioned when you book) and I can in no way begin to fathom how they can justify 70 euros. It is simple case of robbery and Ryanair should be ashamed of themselves. We were by no means the only people caught out with this phenomenal fee and it certainly feels like you are being held to ransom. Another peev was that when we boarded some people had to put their hand luggage in the checked in luggage area as we were told there was no room in the above holders - lie! They were nearly empty. Because of the unjustifiable boarding pass scam I will certainly never book a Ryanair flight of my own accord and I will be telling anyone who chooses to to think before flying Ryanair.
## 1845 My flight was cancelled on May 15th in Spain due to French air traffic controllers being on strike. We got to the gate within 20 mins of departure then screen flashed up cancelled and Ryanair staff vanished as well. Had to queue for 5 hours (standing) for replacement booking over 30 hours later. Cancellation not Ryanair's fault but their staff were few and did not seem to know much. Were put up in a hotel but had to pay for meals which I will try to reclaim. Some people tried rebooking on their mobiles but site kept crashing. Bit of a shambles really!
## 1846 I don't appreciate their staff service before boarding. In my experience when I was leaving from Birmingham for Barcelona I was requested to put my cabin luggage into the sizer without reminding. Since my luggage which its design is flexible and there are two rows of zippers at that moment it was not suitable for the sizer. I said I can try to make it smaller but there were three staff crowed to me and threatened me they didn't have time to let me organise my items and charge me the penalty immediately. Their attitudes were like robbers and I didn't have any options then because there was nobody beside me. Actually when I returned from Barcelona the same luggage and there were even more items inside but I've used a belt to tie it up. Therefore the length is much less than 20 cm and it perfectly fit the sizer. Due to the delayed flight every passenger was on board without any checking size of their baggage when I left form Barcelona for Birmingham I've also noticed that most of the suitcases were much larger than me but nobody was requested for penalty. I understand terms and conditions of Ryanair in advance. But what a shame the attitude of Ryanair\342\200\231staff made is unpleasant and 50 pound is not a small fee for me. How come they charged it without any warning (If I could have one more minute to organise my suitcase.) before boarding especially originally I've been tagged the yellow label in the queue however they changed their mind and enforced me when there were no other customers at the boarding gate. I won't recommend anyone to be Ryanair customer and would tell them the story to warn them if they still have to.
## 1847 Flew Paphos-London Stansted on 16th May 2014 and brilliant! We left arrived into Stansted 47 minutes ahead of schedule thanks to the winds and that is the first time ever! Cabin Crew forgot my Curry Noodles but that was fine and were very friendly when I requested it. For 32.99 Euros a bargain for a 2000 mile trip. Adhere to the rules and its worth the price. As for the 7 days check-in boarding card snipe Internet Cafes are cheap these days to quickly visit and print off the result but 10 days would be better I guess.
## 1848 On its new website it started with a 'contact us' form (carefully buried in the depths of their website). That contact form has now got a very clever gimmick - there's a 'comments' box for freehand input but you cannot use it because you first have to select a 'category of comment/complaint'. The moment you do this the freehand box disappears because they want you to use only their computerised answers. Basically Ryanair has not changed its spots in the slightest.
## 1849 I am a regular flyer with ryanair and have booked 26 flights over the last 10 months But now they are really starting to annoy me. I booked a flight for myself wife and daughter in December for this may because of the good flight times. Several months later Ryanair move the flight times back 7 hours meaning we will lose the first day of our holiday. Now we can't print off our return boarding cards which means we must spend another day of our holiday looking for a internet cafe in rural Spain. I for one will looking to use other airlines if this stupid 7-Day Rule continues.
## 1850 I will never fly with this airline again until they do way with this ridiculous 7 day check in rule. Yes you can print your out going cards no problem but you cannot now print your return journey if you are on holiday for more than 7 days! Oh sorry you can? If you pay 10 euros a seat extra for allocated seats! Beware folks it does not say anything about this until after have made the original booking. So this now means that I will have to find an internet cafe\303\251 whilst on holiday or pay 70 euros for each boarding pass. What a scam. Just cannot understand Ryanair on this one. Yes they probably hope to make more money on seats and fines but on the other it will deter a lot of people from booking with them if they are on a trip which lasts for more than 7 days they will lose money this way surely?
## 1851 The new 7 day boarding pass is a Con and Ryanair know it it's just another way of getting more money from you this is not pointed out when you make a booking with them. If this was known when you make the booking that would be fine you would know the cost and that would be that. Now you have to find someone to print off the boarding pass when on holiday not always easy to do. Thumbs down for Ryanair on this one.
## 1852 My wife and I were invited to Milan to visit a company. This company kindly paid for the return flights and emailed me the tickets. Not being able to read Italian I didn't realise that Boarding Cards had to be obtained on- line (FOC). I thought they would be issued when booking in as per my previous experience with BA etc. When we arrived at Stansted we had to purchase the boarding cards at total price of \302\243140.00. This took a maximum of 3 minutes and two pieces of paper to produce. The return flight was delayed for just over 2 hours. This cost me an extra \302\24330.00 parking fee.
## 1853 Last week we went from Brussels to Barcelona and back with Ryanair. Unfortunately my husbands wallet was stolen on our last evening in Barcelona. The police told us that Ryanair could be difficult regarding missing ID. The desk employee however was very understanding and it took all of 30 seconds to place a phone call to Dublin and get the go-ahead. Two stamps later no extra charge and we were on the flight without any problems. Just thought that I should add this positive review to the complaints this airline gets.
## 1854 Flew from EMA to AGP on Monday 5th May and returned Saturday 10th May. Both flights were ahead of schedule customer service from the cabin crew was great even though we didn't purchase anything onboard. Seating was as expected flights were almost full both ways and noisy with disobedient children. It was our first flight with Ryanair but I can say that we would fly them again we are hardened BA fans for both short and long haul and will travel hours out of our way to London just to fly them but Ryanair will definitely be given consideration next time we book a short haul flight.
## 1855 Being a relatively frequent traveller on short haul sectors between FKB SXB BSL and STN I am quite used to the speed at which the trolley passes the frequent announcements and the dreaded trumpet fanfare signalling an on- time or ahead of schedule arrival. I read the T&C carefully watch what I click on the website and generally survive the experience! Towards the end of April I took one of Ryanair's longest haul flights between STN and KGS (Kos) approx 3 hours 50 mins. What a different experience. Relaxed cabin crew efficient service no unnecessary announcements! A pleasure despite somewhat hard seating and a shortage of sandwiches on the return sector a week later. Charming staff on-time flights and good landings. Well done Ryanair. (And I never thought I'd say that! But in the case of my two flights 22/4 STN-KGS and 29/4 KGS-STN it reflects the quality of service I received!).
## 1856 We flew from Luton to Gran Canaria and back. Both flights were full and both were on time. The seats were clean and comfortable. We were worried about Ryanair's reputation before the flight but these fears were unfounded. We will use Ryanair again. The only criticism that I have is the constant on board sales pitch for food perfumes and scratch card. Other than that the flights were excellent.
## 1857 Flew four times with Ryanair once on 10/01/14 and 13/03/14 from Birmingham to Dublin and return FR663-FR666 and FR663-FR668. Both flights on time friendly cabin crew and good PA announcements with a detailed journey of the flight. Cabin crew served a smile with their service and was polite on all the flights I've encountered with them. Return flight on 13/03/14 FR668. Cabin crew very friendly. Aircraft's flown on was both 737-800 EI-DYP EI-ESY EI-EKK EI-DYD.
## 1858 First time have flown with Ryanair it was to Gran Canaria. Boarding cards easy to print out and able to pre book seats both ways. Plane was clean and plenty of leg room. Staff were very helpful during the flight. All in all will use Ryanair again. One thing the flight supervisors on both flights spoke far too fast it may be a small thing but very hard to understand.
## 1859 I have used Ryanair before this April when I went to Tenerife and have mainly found them ok however on this last trip I printed out the boarding cards for the flight out and was not taken to the flights back so thought I couldn't print those out. However when arriving at Tenerife South and standing in the queue for ages I was told I would have to pay 70 euros for each boarding card to be printed also I apparently hadn't booked a case which was a little strange as I had booked one on the way out. After queuing I was sent to the Ryanair desk where I was told I would have to pay 140 euros. So two pensioners had to fork out 140 euros for something that took 2 seconds. It will be a long while before I use Ryanair again.
## 1860 The first time we have used Ryanair as we tend to travel more upmarket as price is not an issue but our son in law booked our flights to Barcelona we were very impressed. Good flights and on time. Would definitely recommend. If you keep to the rules there is no problems.
## 1861 Stansted-Barcelona out last Tues back Fri. If O'Leary means what he say's about improving customer service and maintains low/competitive prices they will regain my custom and no doubt that of several friends and colleagues. However I wonder if his apparent change of direction will be truly 'trained in' or is just a sop to shareholders? Until now his is the attitude that all his staff try to emulate and it's not pretty!
## 1862 Although personally I prefer Easyjet and think the service is better everybody on here moaning about various issues / things to do with Ryanair need to realise they're booking a flight on a budget airline which can be priced at 20% of the cost of flying with a national carrier such as BA or KLM or other tour operator airlines such as Monarch Thomas Cook or TUI only if booked at the right time. People moaning about not being able to print boarding passes or check in for more than a week in advance should book reserved seating on the aircraft this allows you to check in and print boarding passes for the following 30 days! Ryanair makes it's profits from various add ons - i.e baggage seat allocation expensive food/drinks. Once all this is added the difference in cost with booking with another airline is still substantial. I am flying to Gran Canaria next week for which I have paid \302\243106.48 return including the added seat allocation reservation. I checked in for both flights on the 17th April. I shall be taking a sandwich onto the flight which will saved me paying \302\2436 for a tasteless one from Ryanair I'll even take a soft drink on board. When booking my flight I had the option to fly Thomas Cook Norwegian Air or Jet2 on the days I wanted to travel - however all 3 were over \302\243300! I could of flown BA via Madrid for\302\243\302\243233 alternatively but that would of meant changing aircraft and flying the second part of my journey using Iberia from Madrid hence taking nearly 7 hours.
## 1863 Now retired my job took me all over the world I am an ex constant-flyer. I have been using Ryanair flights from Reus on average 5 times a year for 10 years. Providing that you read the booking site carefully and conform there should be very few snags. I've encountered two delayed flights neither of which was down to Ryanair and one bottle of corked red wine. On the plus side is the consistently excellent value-for-money fares and rapid turn- around. Recent improvements are welcome cabin staff seem brighter - but best of all if you drop a clanger when booking it is now possible to correct it.
## 1864 I agree with others that it is ridiculous not to be able to check in for a return flight if it is more than 7 days. I had to get up at 5.30am this morning to do so or pay the fine. Makes for an unpleasant taste about Ryanair - don't upset customers with such silly rules only to make money. It cheapens your standing. You could be the Nation's favourite if you would listen and make some improvements as you have had to do in the past to re-gain respectability.
## 1865 East Midland to Faro 30th April. Amazed at the improvements. No scratch cards no continual announcements staff great and very smart. Transformed from my last flight. I used to avoid Ryanair and I fly 20 times a year. Pushing and shoving nasty staff and anything to get more money but yesterday was great and I will definitely use them a lot more.
## 1866 So very annoying that just when you thought Ryanair listened to their customers the welcome changes in website access and allocated seating are undone by not being able to print return boarding passes if your trip is longer than a week.
## 1867 We recently flew to Gerona from Manchester with Ryanair. There were 6 of us travelling. After all the bad press about Ryanair really cannot understand what people are complaining about. We had the easiest and fastest check in any of us have experienced. The staff were all very helpful. Then leaving Gerona back to Manchester was exactly the same. Would definitely use again and recommend to other people.
## 1868 This is the first time I have flown Ryanair definitely not the last. It was simple. Allowed to take a reasonably sized case on-board plus a second hand luggage. Staff were more than helpful flight staff were polite and the on- board food for the price of the ticket was excellent. The way Ryanair works buy offering a menu style selection was great. Better than the reheated rubbish just thrown in front of you on other airlines. I am happy to log on to their website to confirm your tickets. I was on and off the plane in no time. Being able to take my luggage on- board and choose to sit in front there was no waiting just doors open off plane through customs home. Keep it up Ryanair and I will keep using them.
## 1869 Flew from Leeds Bradford to Lanzerote inbound and outbound flights. On time staff excellent friendly and efficient. Flown to several destinations previously and always excellent value. All seats are now allocated so don't know why people moan about a free for all. Don't know what some people expect for the money if you have the correct docs get there on time and your cases and baggage are within the stated limits then you will not have a problem if they are not then it is your own fault and you should double check your paperwork.
## 1870 Travel with Ryanair for 5 holidays per year have had no complaints about their rules and reg's until now. In order to be certain that I have a boarding pass for the return flight I have to pre book seats on return flight. This is due to a reduction to 7 days of online check in time. Not everyone has access to a computer and printer when abroad! I hope that someone from Ryanair reads this and realises that customer satisfaction is better than possibly gaining a few extra euros.
## 1871 I booked a ticket from Bucharest to London Stansted with Ryanair on April 24 and was unable to check-in for the flight. The website kept giving error messages every time I tried and when I explained this to the people at the airport their only reply was we cannot check you in unless you pay the 70 euro fee. Though I explained there was no way for me to check in and I was not even the only person that experienced the problem they insisted there was nothing they could do. I tried calling before the flight but their customer support number could not be accessed outside of the UK and Ireland. This was not even a cheap flight and to be sure it will be my first and last on Ryanair.
## 1872 I fly Ryanair to various European destinations about a dozen times a year and more frequently between Manchester and Faro - Have no complaints whatsoever with airline or staff - always polite and efficient especially on MAN-FAO route. My complaint is the lack of intelligence manners and social skills of a significant minority of passengers which coupled with their foul mouthed behaviour can make flying with Ryanair "stressful" at times.
## 1873 Horrible experience from Lisbon to Brussels on 23/4/2014. Not only passengers were treated like cattle but the flight had a 45 minute delay. The worst part was that I could not take my personal cabin size luggage into the cabin. Furthermore I was travelling with a 3 year old and no logical explanation was given concerning the criteria to select passengers who could not take their cabin luggage. All personnel (at the airport and in-flight) was very rude and not even an apology for the delay was given. Finally the tickets were not that cheap. Common sense is urgently needed!
## 1874 I cannot fault Ryanair on our recent trip to France. Flew out 16th April and back on 23rd April. We were 10 minutes late setting off (through no fault of their own someone had left a buggy at the steps and could not fly until they found the owner). The pilot made up the lost time and we landed on time in France. The return flight left on time and we arrived 25 mins early in England. Check in etc were smooth and no problems.
## 1875 Ryanair are a rip off we booked a 2 week holiday with Ryanair able to print off our boarding passes for the flight out but not for the flight back. I assumed you were just given them at the airport on the way back when we arrived at the airport we went to the check in desk and were directed to another desk where they told us that we would have to pay \302\243350 or we would not be allowed on the flight as a family with 4 young children we had no choice but to hand over the money. This is a terrible way to run an airline taking all that money from a family and being told we would have to pay or we would not be getting on the flight.
## 1876 Stansted - Warsaw Modlin - Stansted. FR2286 and FR1021. I have only recently started using them (I lived near Heathrow before so Stansted wasn't an option). The prices are extraordinary and if you follow the rules closely and diligently then the prices remain extraordinary. The people who complain for the large part seem to be people who did not (or could not) comply with the rules. But the rules are clear.
## 1877 I have flown with Ryanair many times over the past 6 years and I have just two wishes. Firstly that they would stop being secretive about their latest scam and secondly if they continue to fly to Valencia they consider not changing flight details with such short notice. In March I booked some flights home from Alicante having read in their terms and conditions that they were changing the 14 day check in online to 30 days from April. However nowhere did it mention that they would be charging for the privilege or I most definitely would have booked easyjet who have had the free 30 day check in for sometime. In relation to Valencia flights they have two scheduled flights a week. In the past after disagreement with Valencia they just cancelled the whole route so I was pleased it recommenced even if it was from Manchester. They have now had to push the Monday flight back by half an hour and have given me 3 weeks notice of the change. It now lands at 11pm. Now that doesn't seem like a lot but unfortunately it has quite an impact cost wise as the majority of the car hire firms in Valencia close at 11 and therefore charge you 30-40 euros to open later. Sadly I'll have to now give up on Ryanair just when I think they were really trying hard. I have always followed the rules and never been disappointed with them to be honest you get what you pay for but I'm finally getting to old to try and stay ahead of their next money making change and 7 days check in is ridiculous so it's back to Easyjet.
## 1878 I would like (or a change) to compliment Ryanair on the way they handle my recent cancellation of my flight from Edinburgh to Alicante the staff were very supportive and understanding on our bereavement the cancellation and rebooking took place with dignity.
## 1879 It was a fantastic trip from beginning to end. I flew from EMA (East Midland Airport) to CHQ Chanea. The plane was clean my paid extra allocated seat was comfortable and spacious. The flight departed and arrived on time. The crew were helpful. I would fly with them again.
## 1880 Rome to Poznan great flight although almost full smiling staff the pilot informed twice about the route and the weather conditions. Cherry on the cake we arrived 35 mins ahead of schedule which was highly appreciated by all the passengers. Highly recommended great value for money.
## 1881 I have been travelling with Ryanair for 4 years and I travel at least 3 times a year to Dublin from Birmingham. I have no complaints except for on one trip we had to travel to EMA as flights were fogbound and it would have been nice to have someone to explain what had happened.
## 1882 This allocated seating scam is a real pain I cannot obtain free allocated seating for my return flight unless I book within 7 days of departure. As I do not have access to a computer within those 7 days I will have to pay for seats prior to my outbound flight. I suspect Ryanair new this might be the case and saw it as a way of raising extra revenue. Although the flights are nearly always on time and ground staff slightly more polite than they have been in the past. This is ridiculous as all the women do is stick their handbag into their larger bag then take it out again when on board.
## 1883 Flew a few times with Ryanair now. I really can't find anything bad at all to say about my most recent flight return from East Midlands to Malaga. On time both ways comfortable clean good price very friendly cabin crew. I would definitely fly with them again. The 90 cases rule did not seem to be in operation as everyone who boarded (and the aircraft both ways was almost full) got their case into the cabin. It seems that these days no one actually checks baggage in opting instead to take their free piece of cabin luggage. We did not pre book our seats and were seated together both ways. All good. We'll done once again to Ryanair.
## 1884 East Midlands to Tenerife 6th April FR3152. Returned 11th April FR3153. It's great to see that they are finally trying to improve customer service and it was definitely better on the way out. Having allocated seating now is much better although it was not clear when I booked that seats are allocated free at online check in so I unnecessarily paid \302\24340 to do this in advance. Also what on earth is going on with the 'only the first 90 bags' can stay in the cabin idea? Great that you can now take a small bag (handbag laptop bag etc) and put it under your seat. However only the first 90 passengers are allowed to take a correctly sized and weighted wheeled case on board. At Tenerife they decided that everyone had to do this before they got on the plane and it was chaos with people trying to work out what they needed to take out. Strange also that they only pick on wheeled cases even small ones. My partner had a rucksack the contents of which were about the same weight as mine yet my bag was tagged for the hold. By the time I'd taken out all the valuables - camera iPad Kindle etc there was very little left in it. Also there was plenty of empty space on the overhead compartments once we got onboard. All completely pointless. I do think they are trying but they really don't think these things all the way through! All that is going to happen is that people's 2nd bags are gradually going to get larger and larger and there will be the same old rows at check in and the gate as there have always been! Other than that it's pretty good value for money I guess although I agree with other comments about flights times. Lots of them get into Stansted too late for the last trains which prevents me booking with them. Oh and the seats not reclining and no pocket for belongings continues to be tedious. Especially on longer flights. Still punctuality is very good and it is cheap I guess!
## 1885 3rd April FR8022 STN-MJV. We have flown Ryanair at least 20 times a year for 5 years and only had one very small complaint about a check in incident. No complaints from us and no I'm not easily pleased. In life you get what you pay for and I am happy to spend my money with them.
## 1886 We have flown backwards and forwards to Crete with Ryanair several times over the past few years. We have never had any problems. Cabin crew have been friendly and pleasant on all of our flights. We know the rules and stick to them. The only niggle is the price of hold luggage so we try to travel with hand luggage at all times. Our last two flights both arrived 30 mins early and we have never had a delay past 15 mins. After travelling with BA to New Zealand last year I would choose Ryanair anytime! Now they have altered their web site and allowed an extra bag in the cabin they are a delight to travel with.
## 1887 Used Ryanair for the first time not by choice but as part off an all inclusive package to Tenerife. Apart from some confusion with boarding gate allocation in Tenerife South airport I have no issues about the airline. This is despite my reservations after hearing horror stories about the airline. As I have no other Ryanair flight experiences to compare this one with I have to say that I was completely satisfied on this occasion. Will I use them again? No reason not to. The staff were quite pleasant. They all seemed to be Eastern European and this was not a problem.
## 1888 Used Ryanair a total of 17 times. I know the rules and I am totally 100% happy with the service. Cheap flights allocated seating and now (thank goodness) I can take on a hand bag as well as my 10k case. I really don't understand why anyone complains. Most recent flight was on 5th April. Oh and only ever had one late flight out of 17 - not bad!
## 1889 We have never flown with Ryanair before so were concerned after reading reviews. Our experience was very good. I could not fault them. We flew from East Midlands to Lanzarote April 2014. The flight was on time the staff friendly and helpful. Seats are now allocated before flying which must save hassle. No problems with luggage. I have flown with BA and Virgin and it cannot compete with them but I would place it top of the many budget airlines I have flown with. I don't usually leave reviews but feel that it is perhaps only those that have problems that do so thought I would like to balance the scales a little.
## 1890 Just went to print my boarding pass. Got caught with the new 7 day rule. I had to buy seats for return as I know I will not be able to get to a printer while away. I hope that when they go to the better Aer Lingus system of either printing at airport or on phone app things should improve.
## 1891 Generally I have no problem with Ryanair flights quick and effective service. I do think though more thought could be put into their timetable as flights arriving in Manchester at 23.45 means that there are no transport options from Manchester airport other than by Taxi very expensive to get anywhere from the Airport. Car rental village closes at 00.00 and the last train is at 00.01 with a 5.30 wait in the airport until the next transport out and most shops closed it is not an ideal time to be landing.
## 1892 I have flown with Ryanair many times over the past 5 years and require full airport assistance as I am an amputee. I cannot praise Ryanair highly enough. I have never had any problems at all and the staff are wonderful. The Special Assistance team always go that wee extra bit to help. I wish they flew to Newark NJ. and Florida as they could show Continental Virgin etc. a thing or two.
## 1893 I use Ryanair 5 or 6 times a year to Bergerac and I am getting a little tired of travellers that don't follow the airlines rules and then complain about them. Every flight that I have taken has been on time I have had no problems at check in or boarding and the crew out of Liverpool are always friendly caring and professional. Remember this flight out of Liverpool departs at 06.40am when passengers cannot be at their best but crew are always great.
## 1894 We flew from Malaga to Leeds. Queued 55 minutes to check bags in (only 2 people taking bags for all flights). On return put up with that on time trumpet blast only to have to wait 30 minutes for the carousel to start whilst the handlers loaded the outgoing aircraft.
## 1895 Travelled from LPL to DUB and back. Quick check in very efficient boarding only quibble being the very tight leg room. Otherwise I have no complaints and felt staff were friendly and efficient. Coming back turn around was remarkably rapid and both times luggage delivery was quick.
## 1896 I fly with Ryanair at least every month. If you compare the flights with travel by coach (which is how they are priced) they are easily as good. One has to stick to the rules and those who try it on with the cabin luggage size and weight allowances deserve all they get in my view. I do feel sorry for those who innocently don't pay enough attention to the very thorough pre flight reminders you always get sent. My flights are about 2.5 hours and that's fine but the seats are a tight fit and do not recline (I am not large but fellow passengers often are) so would not want to be onboard much longer than that. Aircraft's are in good nick and always clean and staff are generally friendly and helpful. Food is edible but only in an emergency! Coffee is fine and sensibly not served too hot. The lottery ticket sales used to grate but as they do fund deserving children's charities it is harsh to moan about that. Reliability on the route I use is excellent as is baggage handling. It is what it is - don't try to judge it by comparison with anything else.
## 1897 We have just returned from a week in Gran Canaria. This was our first flight with Ryanair and our first online flight booking. We are not very good on computer bookings and missed the fact that you need to print 2 boarding passes even though we had two separate sheets with two different flight numbers on. We accept that this was our fault but I like to think this was human error. Again we accept that staff cannot be expected to spend hours printing off tickets for idiots! However do you really need to charge so much to do so? Also the receptionist who had to deal with us was not fully experienced and needed to employ the help of her colleagues which caused extended delay to three queues instead of one making us feel very embarrassed and small.
## 1898 London Stansted to Porto 26 March 2014 on FR8343. This was my first Ryanair flight for nearly two years and I'm happy to see that some things have changed for the better. No queue at the bag drop desk. Assigned seating is a nice new addition though boarding leaves much to be desired - flight departed 20 minutes late due the slightly slow boarding process which prompted some passengers to buy overpriced priority boarding from Ryanair staff hanging around the gate. Crew on board were professional and what I've noticed is that they smile and are happy to have friendly banter with passengers now - so that's a really added plus since my last trip! Seats not amazingly comfy but ok for the short flight. Arrived in Porto ahead of arrival time and bags were on the belt almost immediately (this is something good that hasn't changed!). I'm impressed by the recent improvements and of course I will consider flying Ryanair again as long as the price is right.
## 1899 Luton to Gran Canaria. I booked it not because it was fairly reasonable price but because it was from a nearby airport. After check-in and gestapo tactics used to extort money for oversized hand baggage my partner spent much of our Holiday stressing about what might happen during the return flight home. Check in even suggested throwing some clothing away to keep the weight down even though the same clothing weight had been ok on the outbound leg. Never again I would happily pay an extra few quid to another airline and be relaxed and enjoy the break. Its surprising just how many folk we chatted with at the Hotel were worried at what tricks might be foisted on them at the Foreign airport relating to hand Baggage.
## 1900 Flew Ryanair for the first time 2 weeks ago and again last week. Derry to Birmingham and back. Having read the reviews it was with some trepidation I booked the flights as they are the only airline flying to Derry it was forced on me. The web site wasn't too difficult and I was prompted by online live chat if I dallied they were helpful and reassured me only one booking had been made. Paid for hold luggage as I had a laptop bag as well. Reserved seats were welcome. I printed the boarding passes off before hand and arrived in plenty of time. Onboard reasonable bit garish and the selling wasn't too obnoxious given only a 50 min flight. Depart and arrive on time. So overall the experience wasn't too bad but then everything worked ok. The nagging feeling is what if it hadn't? But given the price you get what you pay for. Would I fly with them again? Given it was the only airline to that airport then yes. If to another airport and there was an alternative and there were consequences to not arriving on time and the company was paying then I would think very hard about it.
## 1901 I often fly with Ryanair between Dublin and Nantes. They are always on time (more or less 30min max) plus are the only ones to offer a direct flight between those 2 cities. Don't expect much on the service side : they have very good deals for the tickets and they bring you from point A to B that's it! Be careful though with all the added fees they can charge.
## 1902 I recently flew from Manchester to Rome and had to ask for a wheelchair both going and on return. Ryanair organised this for me. Staff were waiting at both ends. The staff who were waiting were friendly efficient and very professional.
## 1903 We flew last week Manchester - Alicante. The flight and boarding were flawless we only had hand luggage and had priority boarding. Outbound we were delayed by almost 2 hours because of French ATC problems but other than this the flight was quite unremarkable. the seats don't recline which in my opinion is a bonus and were adequate for a sub 3 hour flight. The tickets were fairly priced and the allocated seating is as it should be. Cabin crew were great and cockpit announcements fine. I'd gladly fly with Ryanair again. There was zero IFE but I had my tablet and didn't expect otherwise. Food and beverages were priced as expected.
## 1904 Travelled many times with Ryanair LBA to ALC. Always on time give or take 15 mins. Staff generally helpful and friendly. Comfortable flight. Spotlessly clean bright plane. Seats ok for the larger person. Not always food available but ok for short flight. Only gripe a couple of years ago delayed boarding at Alicante. Passengers were rushed on plane resulting in bedlam. Plane taxiing before everyone seated and not enough baggage space. Normally let a few on at a time which is usually fine.
## 1905 I've taken literally hundreds of flights with Ryanair from London to Kerry - either Stansted or Luton in the last ten years. Twice flights were cancelled once delayed and once I had baggage that was overweight which resulted in a penalty. I've never had a problem with any staff always found them fine - they respond to how you talk to them I think. They are always cheap and I can't fault them. I always paid priority got there early accepted what I couldn't change. I have trained myself to sleep as soon as I board so onboard purchased don't bother me.
## 1906 14th March Tenerife to Manchester and yet again no food for sale on the flight. There were quite a few people not happy with the situation but the crew just said they had nothing for sale. No inflight magazines were handed out so when they came with the duty free sales not much was sold as no one knew what was for sale. I really wish that Ryanair would sort out the inflight service as I enjoy all the other aspects of flying Ryanair but this lets them down terribly.
## 1907 Flew from Edinburgh (EDI) to Alicante (ALC) and found that the journey had pros and cons. The pros are Ryanair is a very cheap airline to fly with it usually gets you to your destination 20 mins earlier before scheduled time when you land there is a fanfare sound which is quite funny and the staff are helpful because I had asked for a sick bag and got one right away. Cons are the seats are not comfy at all the staff are arrogant the leg room is very limited the food is expensive and when you board the aircraft it has a very weird strong smell. Would maybe fly with Ryanair again.
## 1908 Flew to Marrakech with Ryanair and was very impressed with the improvements they have made from their website to the allocated seating. Much better and credit where credit is due. Special mention to the cabin staff who were smart friendly and very efficient - in fact far better than on a recent Air Canada flight where the cabin staff were miserable and unhelpful.
## 1909 London Stansted to Tampere Rygge to London Stansted all in all a bargain bucket of a silly price of \302\24336 return in January and booked 2 weeks in advance! They must be successful because the flights are always busy. I will keep using Ryanair because they are cheap cheerful idealistic flight times safe and very much punctual. Take no notice of the cabin crew much and adhere to their rules in other words be organised as it is not rocket science and you will be flying safely high! Why pay more money to fly into a rip off "tax con" major airport when Tampere is just a 1hr30 minute cheap train ride to Helsinki and believe me Tampere is a very non-congestive airport like Rygge.
## 1910 Flew Bristol to Malaga. As usual flight on time good service and at a price impossible to beat and I have tried. Flying to Gran Canaria on the 8th March and I am sure I will get the same excellent service as I have on all flights with Ryanair.
## 1911 Outward 11 Feb Bristol to Faro return. Brilliant does what it says on the box left on time arrived early same on return. All staff friendly and helpful. Will I use them again - yes.
## 1912 Ryanair has a very long way to go to improve the service it offers. I experienced appalling customer service on a flight from Bristol to Dublin on 14th Feb. A male steward took Ryanair's poor customer service to a new low - he was extremely rude bad humoured and swore in front of my 11 year old daughter. Additionally Ryanair's new seat allocation policy appears to be at the expense of carrying on your hand luggage if your bag is not in the first 90 bags on board. Not only had I the inconvenience of lugging my case around the airport but had to wait for it in Bristol as it was taken off me as I boarded. Always 1 step forward and 2 back with Ryanair Easyjet is cheap and cheerful Ryanair is cheap and nasty.
## 1913 I fly on average once a fortnight with Ryanair and can't fault them. They get you from A to B on time and cheaply. You can still check in up to 15 days before the flight without having to pay for an allocated seat despite what they say. In fact if you are crafty you can actually choose your seat free of charge by doing the following: click on 'Choose a Seat' check which ones have already been allocated knowing that they allocate the seats in alternate rows front and back starting either side of the overwing exit rows. If you are happy with the next available seat then exit this page and click on 'Do not Choose Seat' and you will get that seat. If you are not happy with the location of the next available seat then exit check-in process altogether and try again later. It works!
## 1914 Feb 14 MAN-Paphos. This is the most budget airline I have come across I became paranoid about the weight of my luggage! Thankfully we were within the guidelines however on arrival to the gate (2 Ryanair) employees were waiting to pounce scrutinising everyone's hand luggage and asking them to place their cabin bags in the frame. Lucky for us we were OK but numerous passengers who 'could not fit' theirs were made to pay \302\24350 which were then put in the hold. Why did the check in staff not ask to weigh their cabin bags at check in - in my opinion this is the way they make an extra \302\24350 per passenger - some cheap flight for these unfortunate people (students) many of whom were going home for half term and short of money to begin with - for me never again. Ryanair have no PR skills whatsoever this is a complete lack of training in every area of customer service.
## 1915 Flew from MAN-AGP 1st Feb. Flight left on time and arrived in Malaga with the usual fanfare. I had the new allocated seating which was fine (window seat). Leg room is fine and lights were kept dimmed as it was an evening flight. Cabin crew friendly and helpful. Price wise for drinks/food they are slightly expensive. I have never had a problem with Ryanair it's low cost and you get what you pay for.
## 1916 Brussels-Charleroi-Marseille return Feb 4 and Feb 11 2014. A 1.5 hours flight arrival and departure right on time friendly staff smooth flights 10 kg free hand luggage an assigned seat quick connections to the cities I fly Ryanair a dozen times a year never encountered any trouble whatsoever. Print your boarding pass keep luggage to a minimum and enjoy your flight. It's beyond my comprehension why people complain about Ryanair.
## 1917 Barcelona - Las Palmas Feb 14 return Feb 18. Saying goes "you get what you pay for" with Ryanair you get less. Went for a weekend to rest and came back exhausted mainly due to a very uncomfortable flight. Advertisements everywhere stressed out staff plastic seats that won't recline.
## 1918 February 2014 flights to and from Bristol and Lanzarote. Seats already allocated so no mad rush across the tarmac and both flights on time or nearly so. Not particularly great value as I couldn't book until late on but that's way it goes. Otherwise Ryanair got us there and back as per the deal.
## 1919 Manchester T3 to Rzesz\303\263w (FR3202) 28 Jan 2014. Rzesz\303\263w to Manchester T3 (FR3203) 8 Feb 2014. Recently used Ryanair for skiing holiday. Fantastic airline lowest fares in the market punctual recent improvements ie allocated seating no announcements after 9pm dimmed lights made my trip smooth. Cabin crew very friendly. Both inbound and outbound flights landed 20 minutes earlier.
## 1920 Becoming a fan of Ryanair! Have to be honest we avoided them for so long but on the flights we have taken recently they cannot be faulted. On time in fact early on both times. Fantastic prices to and from Tenerife great service onboard. The time had come that there is very little difference between Monarch who we have used for years to fly to Tenerife except that you pay about 60% more and their flights are often delayed. Keep the improvement going and focus on Customer Service and you will have won 2 new customers. Looking forward to having the boarding pass on the phone which I understand is coming later in the year.
## 1921 I have just (a) checked in my wife for a flight to Dublin next week and (b) seen the comment that you can't check in more than 7 days in advance without paying. When I checked my wife in she was automatically offered check in for the return flight (with allocated seat) even though that is more than 7 days in advance. Be warned though in common with Jet2 and other airlines she did find that seat she was allocated was a middle one. As ever you get what you pay for.
## 1922 After years of refusing to use Ryanair due to time/date constraints I had to book a flight with them today. I've also heard and did notice that they've removed ridiculous charges (for paying on line etc). However I've just noticed that I can only check in online 7 days before the flights unless I buy a pre-allocated seat. Because of my flight times this means I will have to find a place to print out my boarding pass while away. So yes it's an improvement that people can pre book seats but they have reduced the online check in time from 15 days to 7 if you don't pre book and pay for the seats. This will be the last time I book with them - I've not even flown yet.
## 1923 I have flown many times with Ryanair from both London Stansted and East Midlands to Valencia and never once have I had cause to complain all but two flights out of around 90 have been on time and those that were late were only around 20 mins late. The cabin crew have always been polite and smiling. This is a budget airline a point many miserable individuals seem to forget. You get what you pay for that said they need to scrap the allocated seating it doesn't work and is a real pain.
## 1924 Have flown MAN - DUB - MAN/LBA bi-monthly with Ryanair and have been very impressed every single time. First of all a flight 2 weeks in advance from the booking date for \302\2439.99 one way can not be denied this is a brilliant price for an on-time flight on a virtually brand new 737-800. The one gripe I'd have is the allocated seating (something that most airlines use effectively). As a frequent FR traveller I pick the same seat every time unfortunately the common sense of booking and then finding your seat seems to have evaded some people as it turned into some chaos - so I'd advise to still get on the aircraft towards the front. Other than that I'm extremely happy to fly Ryanair again and again as the on-time no-frills cheap flights will always be too good to turn down! Follow the rules and you will certainly enjoy your flight.
## 1925 First experience of Ryanair's new self proclaimed 'industry leading customer service'. Stansted to Tampere out 31st Jan return 3rd Feb. The allocated seating (on the return leg) was a big improvement. The seats are still bolt upright but at 6ft 3 I've never found the legroom to be that bad. This leaves us with the migrane inducing yellow the bright cabin lights and the constant procession of scratchcard sales and frankly annoying announcements about the still overpriced microwave food to moan about. They seem to have at least stopped the irritating soft drink adverts on replay. I guess Ryanair are an option if they are flying where you want to actually go but my own conclusion - as a relatively frequent flyer - is that there is no point in saving a little bit of money if it costs you a lot of time and hassle which on this trip it still did.
## 1926 As we don't like the free-for-all mess at the airport we booked Priority Tickets and reserved seats to Fuerteventura on 7 Jan 2014. All went well on flight over and as promised the flight was actually a bit early. On dep however we arrived at Fuerteventura airport to be informed that we check in at desks 20-22. We stood in queue for desk 22 and after 10 minutes one check in clerk sat in at desk 22. After 10 minutes she spent some time on the phone and several people moved from the other 2 queues to 22. Eventually after another 10 mins another clerk opened desk 20 and we moved over there. No priority check in just free for all. The flight was called one hour before time and we were all herded like sheep to our gate to watch the previous passengers getting off our flight! There was no allowance for priority passengers and we were all herded in together. What is the point of extolling extra cash from us for Priority booking if we don't get any value for it?
## 1927 Flew Edinburgh to Alicante and return - flights both ways were punctual and there was a nice holiday atmosphere on board. Boarding was a bit slow on both sectors but once on board there were no delays. Cabin service was friendly and attentive - prices a bit of a rip off but the price the of tickets more than compensates. We travelled with hold luggage and golf clubs - luggage was delivered punctually at both ends. Given the excellent value for money I can't fault Ryanair and will certainly use them again.
## 1928 October 13 Luton to Beziers in France return. Jan 14 Stansted to Vasteras in Sweden return Skavsta Sweden to Stansted. Have had a couple of trips with Ryanair in last 6 months and have had no problems. The cost is so low that you have to expect service is going to be a little less than a national operator but me and my family had no complaints. Staff did their job and some were very nice yes I was worried that ticket bar codes would read OK as I didn't want to have to pay \302\24370 extra for each ticket to be printed at airport. Just follow Ryanair rules double check your details and you should be OK. I took all my 5 grown up children away for the price of a single ticket on a national operator. Also Ryanair planes are all very new under 5 years old so safety should be good.
## 1929 I flew with Ryanair on 16th Jan 2014 and returned 20th Jan to London Gatwick from Cork. I must say from start to finish I found the staff excellent helpful and courteous. I had 2 very pleasant flights - no problem whatsoever.
## 1930 Been flying from London Stansted to Murcia for a few years now and I must say that if you comply with all their rules everything should be fine we have not had any trouble always on time staff nearly always friendly enough flight number FR8027 and FR8028.
## 1931 I can not fault Ryanair I use them a lot and will keep on doing so. The biggest issue most of the people in the North West have is: there are no other airports in the North of the country that fly direct to Lamezia or nearby Blackpool would be fantastic Man or Liverpool. Come on Ryanair what's the problem give the customers what they want one a week would be great.
## 1932 I booked a short break for two to Marrakech and living so close to Stansted airport bought two returns with Ryanair for a brilliant cost of \302\243118 several months ago. As the trip date approached I received an email from them stating that the return flight time had been brought forward by 7 hours with no reason or explanation and a short one line of apology buried in the small print. As this was a 3 \302\275 day trip I elected to cancel and have a refund as I felt that it was unacceptable without explanation to curtail a short break like this. I re-booked with BA from Gatwick at an additional cost of \302\24360 for two.
## 1933 Regularly fly with Ryanair from Dublin to France and it works wonderfully. Listen to a lot of people complaining about the airline and really cannot understand why. Staff are usually pleasant although there is always the exception to the rule. It's always on time boarding and exiting is always efficient. Without this airline we and many others could not fly as often.
## 1934 I had to take 4 flights along with my husband over the Christmas and New year period traveling with others from Paphos to Dublin via Stansted. Unfortunately there are no direct flights from Cyprus to Ireland. My parents informed me of new flights starting from April 2014 from Shannon by Ryanair but unfortunately Paphos was not on the list yet again we seem to miss out in Cyprus! I really can't understand why Ryanair hasn't taken over the Irish route since Helios stopped and then Eurocypria stopped there is no airline covering this route. I've never had a problem with any staff member or been unhappy about the service.
## 1935 Flew FR6621 / 6622 to Tenerife from Edinburgh (return). First and last time I'll use this airline - total rip off. Stood for an hour at Edinburgh check in then another 45 minutes at the gate in the hope my wife and I would get a seat together (why should we pay extra for this?). On board is a joke leg room and general scope of the seating is ridiculous. All cabin crew were rude and only wanted to sell things. We heard about the seat belt signs coming on for turbulence just before the trolleys come out and sure enough this happened twice on the way out and back apparently an old Ryanair trick. Return check in at Tenerife was ridiculous 5 Ryanair flights being checked in at one time through 3 desks that's nearly 700 passengers. No Ryanair staff on duty and no one is interested in what you have to say. Usual stampede for seats together again why should we pay for that privilege? Its standard with everyone else. More rude cabin staff on the way home which cemented not only ours but a lot more people on boards perception of Ryanair - never again.
## 1936 BUD-CRL. It seems like Ryanair is doing a great job trying to change the bad image is has. Both flights on time leg room was much better then Wizz's A320's. Boarding was done very efficiently crew friendly and pilots were very informative.
## 1937 FR555/552 Manchester-Dublin 30/12/13-02/01/14. I fly quite a few times a year but this was my first time with Ryanair so I was interested to compare. I have to say if you follow the rules that are made very clear to you well before departure you will have no problems. There were a few people who hadn't printed boarding passes or their cases were far too big for the cabin and they were moaning about being charged to check them in etc. Yes the fees for printing are totally ridiculous for printing a sheet of paper but just don't get yourself in that situation! I had booked an exit row seat for an extra \302\24310 which included priority boarding. I have to say it was worth it especially being tall. I arrived at the gate 45 minutes before the departure time to see a huge queue waiting for the boarding to start. The priority boarding queue was empty so I walked straight down and waited for around 15 minutes. Then a member of staff came over and said would you like to come forward we are ready after my pass was checked the barrier for the others was opened. I boarded the plane first after a few minutes wait at the bottom of the stairs of the plane and got settled whilst everyone else boarded. I'm not sure if this system works if there is a bus to catch to the plane? One benefit of being nearer to the front of the queue is getting seats with family/friends and having space to store luggage as many people we struggling to find places for their luggage once the plane was filling up. The flight was comfortable and crew were fairly friendly but seemed in a rush to serve drinks and were quite sharp with a few customers who were asking for a drink of water. The people in front were drinking their own alcohol and were sharply told that they couldn't consume their own alcohol on board. Overall I found the experience far better than expected even though the service of other airlines isn't present but the price was far far lower! I would fly Ryanair again especially as their flights seem to have few delays and they are bringing in allocated seating.
## 1938 I have used Ryanair every 4 days since July 13 and their punctuality and reliability has been excellent. Their service has improved less annoying announcements just the on arrival wake up call to go! Sometimes the on board entertainment is excellent. However I still travel extremely stressed I still wonder what will go wrong what will the staff find wrong. Top tip do not be mean pay extra for a reserved seat. Food pricing still a little pricey.
## 1939 My last trip with Ryanair was Modlin-Hahn-Modlin at the beginning of December 2013. Both flights were excellent. Each time I'm in Europe I indulge myself in city hopping. It's only possible thanks to Ryanair's prices. You get what you have paid for: Affordable and safe transport from A to B. Pros: Price modern planes efficient and friendly cabin crew. On time arrivals. Cons: If you have additional luggage you have to pay for it. Make sure your carry on meets the exact size requirements. Seats are a bit tight but for the price I paid I can live with it Comments: If you are budget conscious and adventure oriented definitely go with Ryanair. Really good airline to choose if you like to travel.
## 1940 My mother 85 years of age travelled on 22/12/2013 from Dublin to East Midlands. I had requested wheelchair assistance she received the utmost care and attention from the moment she arrived at Dublin airport to collection at Nottingham. My sincere thanks to Ryanair and to their kind staff that tended my mother throughout.
## 1941 Travel monthly Liverpool to Dublin the most recent the flight from Liverpool could not land due to storm force winds. The 3.20pm flight eventually left at 10.20pm - 5 euro refreshment voucher. We queued for the flight at 7.05pm but that was cancelled for technical reasons. Passengers were offered transfers to flights to Manchester or Birmingham or the 10.20pm flight. I suppose not their fault but instead of asking passengers who wanted to go to Manchester to go to one desk and the others at another desk I was told "first come first served". Strange thing was the late flight could cater for all the passengers who were going to Liverpool so the technical fault saved them a flight to Liverpool. The 10.20pm flight was a nightmare with about twenty males all drunk and swearing and having to be advised by cabin staff to behave to be fair there was no alcohol sold on the flight. I will continue to use Ryanair as they are cheap but when possible travel on early morning flights you miss the stag/hen/football fans. I am looking forward to the allocation of seats so no more stampedes for the departure gates and they are only doing what Easyjet and Aer Lingus currently do. On this trip can only score 4 but have had plenty of tens over the years.
## 1942 EMA to Reus FR6608 on 12/10/13 and Reus to EMA FR6609 on 15/10/13. I used priority boarding all good on time good on board service. No problems at all.
## 1943 SKG-STN-SKG return flight Boeing 737-800. Full flights on both sectors. Clean cabin friendly crew prices a little expensive i think. Seats not so comfortable for a 3 hours flight and especially if the flight is full it gets worse. Overall a good experience if you get a good price.
## 1944 I have flown over 10 times with them! They provide a reasonably comfortable safe and above all inexpensive flight to a good variety of destinations and those who complain have usually griped over some issue they always had control over ie. printing boarding passes luggage allowance etc. Grow up people for heaven's sake recognise a great facility when you see one.
## 1945 Day trip to Bremen 10th December from Stansted. As ever Ryanair was punctual and efficient. It is a flying bus from A to B. There is no ceremony involved. Ryanair has a couple of simple rules about baggage and to have your boarding pass before you arrive. If you can't arrange something as simple as printing out a piece of paper and complain that you have to pay for luggage on top of your massively cheap air ticket to begin with then just don't fly with these people. I'm off to Morocco next from Stansted for less than \302\24370 return. One small backpack well within the limits with a few pairs of jeans and some T-shirts rolled up neatly folded up colour printed boarding passes and remembering to sit on the right hand side of the aircraft to avoid the sun blazing through the window for the morning flight.
## 1946 First time with Ryanair. Just me and my two young grandchildren we did have priority boarding but was still worried. Flew from Birmingham to Tenerife no need to have worried but was glad I had priority boarding more so on the return flight. Would use again.
## 1947 Tenerife to Manchester. Flight left on time and arrived 5 minutes early which they brag about on landing. Heavy landing at Manchester and hard braking as I believe there is an "early turn off" on the runway to allow them to get the gate faster and offloaded/onloaded quicker? First time I have used them for a while and the gaudy yellow and blue cabin interior is a bit hard on the eyes but the crew were friendly and efficient and the legroom and leather seats were better than the Monarch flight we flew down on. They will be better once they allow you to pre book a seat rather than the scrum to get on! Will use again.
## 1948 The bad press surrounding Ryanair proved to be totally unjustified on my round trip Madrid-Cagliari-Madrid. Check- in and security was the quickest and most polite ever (especially at the dedicated check-in/security at Madrid. Boarding was orderly and uneventful (both in Madrid and Cagliari). We left on schedule and arrived early on both segments. The flight attendants were professional polite and friendly. No negative comments at all and I'll be only too happy to fly with Ryanair again.
## 1949 We returned from Gran Canaria to Stansted on the delayed flight (by 2 hours 20 min) on 7/8 December. The passenger next to me was drunk (shouting and carrying on) when he got on the plane. He then drank at least 10 miniature Bacardis and Pepsi supplied enthusiastically by cabin staff. Mercifully he fell asleep but did not fasten his seat belt during landing although he then stood up while the plane was still moving quite fast. There was no inspection of seat belts by cabin staff before landing nor was he told to sit down. Our seats were near the emergency door where passengers are supposed to assist with evacuation. He was a big man who was in no state to assist and would have been a serious hindrance if there had been an emergency. Clearly the policy of the cabin staff is to sell as much booze as possible and not bother with basic safety or the comfort of other passengers.
## 1950 London Stansted to Fuerteventura out on 20th November and return on 27th. First time with Ryanair won't be the last. From the online booking priority boarding getting on getting off the whole experience was brilliant. Had a lot of negative comments from people before we traveled we found it hassle free and relaxing. Staff were friendly and efficient No complaints.
## 1951 I choose the cheapest flights and most convenient schedules available when travelling from Ireland and UK to other European destinations. Approx 9 times out of 10 the winner seems to be Ryanair (price and timing are great). When I choose EasyJet or Aer Lingus I'm delayed 9 times out of 10. Do you want luxury? Do you want 1hr to board a plane? Do you want 1 hr to disembark a plane? If the answer is yes then simply don't choose Ryanair! Are you someone who has several bags? Are you someone who complains and tries to inconvenience others around you? Are you someone who takes 1 flight per year? If so then don't fly Ryanair - and do the rest of us a favour. Let's be realistic. Who gave Europe cheap flights? Ryanair.
## 1952 Use Ryanair on the Leeds Bradford flight often find them a great service very clean and good value for money. Great timing for onward connections.
## 1953 Flew LPL-BCN 22-25 Nov. Pre-booked seats took 10kg in a cabin sized bag fantastic flights great crew arrived early both ways. Flown with Ryanair 5-6 times and have never had a problem with them as long as you know what to expect all for \302\24370 return.
## 1954 We flew from Lanzarote to Glasgow Prestwick on Wednesday 27th November and had a very pleasant flight. The plane was on time and the cabin crew were most helpful and pleasant going about their duties with courtesy and a smile. The flight out went smoothly but the cabin crew were not so happy in their job. We have found that if you adhere to Ryanair's protocol you should not incur any problems and it is certainly quite a bit cheaper than Thomsons or Thomas Cook and based on this flight it couldn't be faulted for what you paid for.
## 1955 Bari to Stansted (Nov 24) - without access to a printer my wife and I arrived at Bari airport for the flight minus boarding passes. We were told that a Euro 70 per person would be charged to print the boarding passes = Euro140 total. This is nothing less than fraudulent.
## 1956 Out 22 Nov back 24 Nov. Flight number 2436 outbound and back flight 2435. My wife and I went on a weekend trip to Krakow. When we were told to board the plane for the return flight we got out onto the concourse but the passengers on the incoming flight were still on it! We stood in pouring rain waiting. What a shambles. Never again.
## 1957 Dreadful staff at Tenerife South two flights Dublin and Manchester queuing together and only one staff member. Had to pay for extra weight after we paid said we could have purchased a Ryanair bag to put items in from case. What difference would that make as the weight would be the same to go on the flight. Dreadful staff on board aircraft - very rude. Instructed all to stay in our seats with seat belts on most of the flights even we had no turbulence just so cabin crew could walk the aisle. Will never fly with Ryanair again and that was said by most customers on that flight.
## 1958 STN-TLL. It's a revelation traveling Ryanair with a checked bag in which case there are no worries about being weighed gate-checked paying fees etc. Ryanair's Stansted terminal is really nice and has plenty of seating shops etc. unlike a lot of newer budget airline terminals. The airline's service has improved on-board staff have always been friendly and involved and I was lucky to get a bulkhead seat so there was enough legroom this time too. Can't beat for the price.
## 1959 This was the first time we had flown with Ryanair flying from Leeds Bradford to Corfu. We had heard so many negative comments about this airline but we speak as we find and everything about this airline was excellent. We pre booked our seats and when we approached the seats they had reserved on them. We have never had so much leg room we also found the seats to be comfy. The aircraft left on time and arrived in Corfu early. When we landed we had a trumpet played to us apparently this is always done when a flight arrives on time or is early. The plane was spotlessly clean and to be quite honest looked brand new. The people working on the plane were extremely courteous and very very smart. I would not hesitate in recommending Ryanair to anyone.
## 1960 This was our first flight with Ryanair and it wont be the last. We as a family flew Liverpool to Dublin return out early morning the flight was exactly on time the plane was clean the crew friendly and we got seats together so no complaints. On the return we were delayed by 2 hours due to fog (no fault of the airline) this time a full flight but still got seats together. We paid a very reasonable price and got a very good service what more could we ask?
## 1961 Value for money was great. No on board entertainment no services at all. But I didn't expect any of them. So if you only want to flight from point A to B Ryanair is perfect!
## 1962 Smooth faultless 2 hour flight with Ryanair from CCF to JLA friendly cabin crew more importantly on time. Pretty much what you'd expect from Ryanair really.
## 1963 Vilnius to Leeds/Bradford Oct 18th. My complaint is about the airport departure experience. Being a party of 5 with a baby we paid for priority boarding. What this meant in practice was that we had the pleasure (!) of standing at the head of a queue for about 75 minutes. The flight was about 30 mins late arriving and departing which must have been known by the departure gate staff yet they made no attempt deal with the queue that formed either by telling people to go and sit down while waiting or delaying checking people through the gate. I have written to Ryanair but am awaiting a response as I write. I can't rubbish them completely as the flight was relatively comfortable and onboard staff were quite pleasant. I understand Ryanair is to introduce a policy of seat allocation this should stop a lot of the problem we experienced though not the part where airport gate staff let passengers through the gate over half an hour before departure.
## 1964 Plane new. Cabin crew OK. Punctual free seating so I was not seated next to my travel companion. Food and drinks for sale - I didn't try them. Constant nagging on the PA about sales sales and more sales. Seats not reclinable. No entertainment. Leaving from remote airport arrived at remote airport. You get what you pay for.
## 1965 We've just returned from a Mid term trip from Knock to Gran Canaria. A very pleasant experience both legs of the journey. Flights on time and the staff very friendly and pleasant. We had booked priority boarding which does make a difference particularly travelling with Children. The inflight menu is extensive and prices are not extreme - just a little dearer than high street. No baggage issues at all and in general a very pleasant journey - \342\202\254600 return for 4 people from Ireland to the Canaires at Mid Term.
## 1966 It was my first time using Ryanair on a trip to London. I booked online and went into manage my booking to book a wheelchair at Dublin and Stansted. I printed both boarding passes and was glad to see wheelchair booked on both boarding card. At Dublin airport got the wheelchair all the way to the departure gate. At Stanstead there were 3 wheelchairs to collect passengers I was brought all the way through the airport and out to the bus stop for London. The cabin crew were friendly. On the return trip the process was the same in reverse.
## 1967 I have just flown from Dublin to Manchester. It was my first time flying with Ryanair and I really wasn't looking forward to the flight as I have heard many extremely bad reviews. The flight in all honestly was not a bad flight we arrived 15 minutes early into Manchester and I have no complaints regarding the crew on board they were pleasant and polite. This company have a terrible reputation for trying to get money any which way they can however if you read the terms and conditions properly there should be no reason for you to part with your hard earned cash. The seat pitch was fine for me a female at 5ft 4 inches and for the 45 minute duration but I can imagine it must be extremely uncomfortable for men as I can imagine if you tall it would be awful for those longer flights. One thing which I really didn't like was the non-existent seat allocation. I felt as if I was part of a cattle herd trying to get on board as people had started to queue an hour before we were due to depart to ensure families got seats together. Ryanair overall is not terrible you get what you pay for. They are a budget no frills airline and I think people tend to forget about that. There is no inflight entertainment not even an inflight magazine people who expect these things really need to remember how much they paid for the flight. I will fly again if they are the cheapest option.
## 1968 I set off from Stansted to Madrid last week only to be forced to pay \302\24370 at the point of entry because I could not print out the boarding pass due to complications on how to go about it. On return I tried to print out another boarding pass but still not possible I went to the airport a day before my departure in there desk but nothing came out of it. The next day I was made to pay another Euro 70.
## 1969 We have chosen to fly with Ryanair from BRS-Chania (Crete) in August 2014 they were at least \302\243300 cheaper than the alternative easyJet flight from BRS-Heraklion. The flight times were perfect too. So we booked with them due to recommendations cost and convenience. The charges are clearly outlined on the conformation e-mail that you must print the passes before you reach the airport! In my opinion people that turn up at the airport without their printed pass are asking for the extra charge. If you don't have a printer then pay for check-in at the airport! Everybody knows Ryanair is about cheap basic travel and if you're expecting anything different then you are ridiculous. I very much look forward to flying with Ryanair.
## 1970 We flew from Manchester to Barcelona on 19th October and returned on 26th. The plane was punctual clean and functional and you get what you pay for. I would advise anyone to pack some sandwiches for each journey and to buy a drink once you have checked in. Boots at Manchester is cheapest for water. The food and drink on the planes are exorbitantly priced. There is no inflight entertainment so take a book. I must say that the leg room in a standard seat was far better than in Thomson plane which we travelled on to Jamaica long-haul! No problems at all.
## 1971 Recently I travelled to Barcelona with British Airways. Have used Ryanair on a number of occasions so I was interested to compare the two. Can't wait to get back to Ryanair. On British Airways the food was rubbish the seat were uncomfortable and cramped and the staff were uninterested in no one but the first class passengers. At least I know when I fly with Ryanair the plane will be new and clean and the seats are comfortable. The food is acceptable and worth the money. They are nearly always on time. Flying with Ryanair is not a problem so long as you stick to the rules. Read everything on the booking form. The last two return flights to Spain cost me \302\24389 including one piece of hold luggage.
## 1972 We travelled as a party my child who is only 10 and had never flown before couldn't sit with me or her dad as there was no seats my nephew wasn't with his mother either - I could'nt believe how we were all separated from each other and a child sitting without a parent. I was annoyed that there was so many seats at the front of the plane where we could have sat together but had rope around them. The crew were rude and not helpful.
## 1973 Valencia to Seville and back last weekend the flights were completely full which caused a bit of chaos as there was not enough room for all of the luggage and the crew had to place some in the hold. This they did with smiles and explanations on both routes. The flights were on time. Our bags were checked for size but not for weight on the way out and neither for size nor weight on the way back. All in all a perfectly satisfactory trip at less tan half of the price of the return train fare.
## 1974 I was going to Crete from Shannon and I used Ryanair 3 times and Easyjet once and I just wanted to say I was very impressed with the service on Ryanair. On 15th Oct I was coming through Stansted and the courtesy of the man who checked me in was first class. It was 4pm. As a business person in the Ennis area I welcome the new Shannon flights and wish them every success. I for one look forward to trying all of them.
## 1975 My husband and myself have flown 4 times this year with Ryanair. We have our check-in bag and our one rucksack (normal sized) between 2 people to place in the overhead cabins. We are sick and tired of these people who take these massive overhead cabin bags and hold up the queue getting inside the aeroplane and finding a seat quickly. Do something about it. We always enjoy our flight and the staff are always very helpfull and polite. I actually spoke to a member of staff about the problem of the bags on the flight from Krakow to Liverpool at 17.50 on the 19th October 2013. The staff know that it is a problem.
## 1976 Nothing wrong with Ryanair as long as you accept them as being 2nd class. They will try to rip you off at every opportunity so it is down to you to double check everything then check again. On my last trip I fancied a drink instead I opted to try the Vegetable soup. Nothing could prepare you for the obnoxious substance they put before me. I took an initial swig and handed it back to the stewardess saying it was disgusting. 2 other travellers within my proximity also complained about it and asked for a refund. No such luck! When it comes to getting change for your order forget it. I'm still waiting for mine from my 2012 holiday. Yes they are awful but they are reasonably cheap.
## 1977 Hahn to Stansted early morning flight. Flight boarded swiftly and efficiently despite being full departed on time and was "early" at Stansted (yes I know the tricks they play with the departure windows to maintain their on-time record). As long as you navigate the website carefully make sure you can print off your boarding card and conform to the luggage rules Ryanair offer good value and good punctuality on short flights. the people who have problems are usually those who haven't read the instructions closely enough or who try to get round the rules.
## 1978 I flew London Stansted (STN) - Bremen BRE today. STN always guarantees you an awful travel experience. Huge crowds everywhere: Long lines in front of baggage drop long lines in front of security long lines in front of the sky train long lines in front of the gate long lines in front of the aircraft. The cabin crew were very friendly taking into account that they had a load of grumpy early morning pax to deal with. (Yes including myself.)
## 1979 Flight from Shannon to Malaga on 1st October return on 8th October. Ryanair ticked all the boxes. We had reserved seats printed boarding passes for both flights weighed luggage beforehand purchased food on board treated with courtesy and friendliness by staff on the ground and in the air. Excellent and will travel again with Ryanair should there be a Shannon flight departing for our destination.
## 1980 My Husband and I are frequent flyers with Ryanair for many years to and from the UK also to and from Carcassonne this year. I have to say we have never encountered any problems flights were on time as much as possible staff are courteous at all times and food is a good acceptable level. I do wish your Shannon - Bristol service would resume we really miss that service in the meantime we will continue to travel to Knock or Dublin or Cork to fly with Ryanair. Their seat reservation is also a good service.
## 1981 Dublin to Ibiza 8 Oct and return 15 Oct 13. First time using Ryanair booked via an online holiday site and wasn't aware on booking that it was Ryanair. We had printed off our boarding passes and booked in hold luggage with smaller bags for hand luggage which fitted under our seats as due to the ridiculous size of hand luggage now allowed by most airlines have had problems in the past finding space above so I don't think it is worth the hassle this is by no means exclusive to Ryanair. Flight was good on time purchased only coffee at 3 euro don't think that is extortionate to pay. My complaints would be: 1) never having flew Ryanair I wasn't aware that it was unallocated seating and this caused a stampede for the seats. 2) due to the quick turnaround the plane was not cleaned between flights and the floor at my seat was covered in used tissue. From Dublin priority boarding did get on first but coming back in Ibiza everyone put onto a bus at the same time priority boarding let off a few minutes earlier but hadn't completed boarding when the next lot got off so I don't think I would pay for PB if flying with them in the future. Yes would use again but not if on a longer flight as wouldn't want to be separated from my travelling companion on a longer journey.
## 1982 Although the vast majority of Ryanair staff we encountered on our flight from Bournemouth Airport were helpful and polite the first woman we encountered on check-in was utterly obnoxious. We had arrived 11 minutes before check- in was to close and no other passengers were queuing except ourselves yet the woman did not meet us with a professional greeting of good morning but barked at us 'You have one minute to process your baggage' and as my husband's suitcase was over the weight limit was unhelpful in resolving the situation and refused to allow us to pay a fine there but only when we had removed the offending items and struggled with them to the departure gate. My husband and I were stunned by this aggressive attitude and absolute lack of professionalism. The struggle to find available seats once we boarded was chaotic and with many crying children was a stressful experience. We returned via a Thomson flight which was an absolute delight by comparison. Suffice to say we will never fly with Ryanair again.
## 1983 Rome to Paris. Disgusted at being charged \302\24370 as I hadn't printed my ticket off. I know they have rules but what a ridiculous amount to charge for a piece of paper. There is no consistency and am unlikely to fly with Ryanair again.
## 1984 We used Ryanair flying from Manchester to Malaga 7th October returning on the 14th we flew as a family of 3 adults and 3 children aged 11 2 and 6 months. after hearing all the horror stories around Ryanair we were feeling quite sceptical however we were impressed with the service they provided they were friendly helpful and informative and we had no problems at all.
## 1985 Madrid-Paris (Beauvais) and return (26-30 September 2013). Perfect flight as always on time both ways. Beauvais is a nice small Provincial airport near Paris no long runnings over the tracks as in Barajas Airport or Schipol or Gatwick. Just 200 meters from the small airport terminal and the plane is taking-off. I fly Ryanair often have flown more than 40 flights and always on time. I recommend you pay for Priority boarding.
## 1986 We have flown with Ryanair to Italy 2-3 times a year for the past 9 years. We have never experienced any major delays and flights have arrived early and on time. The cabin staff have been friendly and courteous. The only problem we have seen recently is the lack of space for hand luggage. Abide by the rules and you can't go wrong. By the way the cappuccinos are to be recommended!
## 1987 Stansted to Fuerteventura cannot believe that unless you priority board they will separate you from your children. Surely this cannot be a suitable situation in the case of an emergency how are under five's expected to understand the safety information.
## 1988 My wife and I are frequent passenger on Ryanair flights our most recent flight was from Shannon to Malaga 20th Aug back on the 10th Sept 2013. I would like to say that if it was not for Ryanair and its cheap flights I would not be able to fly as much as I do all flights with Ryanair have been a most pleasant experience and I have found the staff to be most courteous and helpful. When you book a flight you are told to read terms and conditions so why should Ryanair be to blame. I am looking forward to my next flight.
## 1989 East Midlands to Zadar. Have used Ryanair many times and consider them to be a good airline. Probably flown with them 40 + times and only experienced 1 major delay. This flight again excellent. Flights on time both ways friendly staff seat comfortable enough for a 2-3 hour flight. One big plus with Ryanair is seats do not recline. Nothing worse than restricted legroom being made worse when the passenger in front reclines. There are enough warnings on their website about potential extra charges so if you get caught you only have yourself to blame.
## 1990 Like many people on this site we have used Ryanair before like many we abide by their rules don't necessarily like them but we abide by them. We have a young child so we booked priority boarding - the only airline I know that doesn't allow this as standard (but fair enough that's their policy we know that in advance). So hold luggage booked priority boarding additional infant equipment all paid for. Flying from Edinburgh to Faro was okay long queues at check-in but okay. Trek at Faro up and down stairs 2 year old and 3 bags not great but can't blame Ryanair (although can't help but think they are treated as 3rd class because of the deals they make with airports). Chaos on way back one person at check-in no priority queue at boarding pass check. Advised it would be at the gate nope people were allowed to stampede if you were already at the back tough! So on return to UK I complained and requested that the priority boarding fee was refunded. Rather than customer service I received a curt "we do not make refunds". So despite not getting what we paid for they pocket the money anyway Will we use them again probably simply they put they get you there but I will treat them with the same respect that they show their customers.
## 1991 Great flight from Knock to Luton on 27 Sept to 29 Sept. All for 32 euros. Easy online booking / boarding card / friendly staff.
## 1992 Flown numerous times with Ryanair. Liverpool to Reus. Always the cheapest. With Ryanair all you have to do is follow some very basic rules and you wont have any trouble at all. Make sure you have booked in any hold luggage on line its much cheaper but you can take 10kg each as hand luggage6 of us so spreading it round saves you a lot of money. Also it amazes me when people cry when they have to pay the \302\24360 if they haven't printed their boarding cards before hand. Why not? I do not have a printer so just pop down to a local library to print them out. Yes Ryanair is a bit like catching a bus and you just sit where there is space but so what flight times are not long haul and I'm sure you can put up with it for a few hours. There is a lot of selling during the flight but again so what. Don't buy anything if you don't want to. Food is a rip off agreed so I have never purchased anything. So let me give you an example of how much cheaper it is to fly with Ryanair. It cost us a family of 6 just under \302\243 \302\243600 in Sept for return flights to Reus.
## 1993 24/9 and 1/10 Manchester - Faro. Perhaps I am too fussy as I normally fly scheduled for business and this was the first time I used Ryanair. I weighed my case at 14kg but Ryanair insisted it was 17kg. I was told to take things out and put them in my golf bag. If you forget the boarding pass that is printed by yourself there is a penalty of\302\243\302\24370! The crew on both legs were surly. All they did on a 2.5 hour flight was to try and sell things. Boarding is a joke with everyone squeezing 10kg in lockers which do not have the capacity. As I said I normally fly schedule and they appear a similar price for far superior service. Although the flights were on time passenger service and treatment with a constant aim of collecting more money is a dreadful experience.
## 1994 We flew this weekend for the first time with Ryanair from London Stansted to Kerry. We have avoided them in the past due to various negative reports in the media. I have to say they were on time in both directions (actually early) the crew were polite and helpful. The plane seemed fine pilot information was good regarding weather etc. I have to say we did follow the rules I purchased scales to weigh our bags printed the boarding cards at the correct size and arrived in plenty of time to catch the plane. I was ready for a very unpleasant delay with grumpy staff in poor uniforms and dirty seats to sit on but what I got was actually a very good service from what appeared to be a reasonable airline operator. Would I have wanted to fly to St. Lucia on board maybe not as the finer comforts are not there but for me I would definitely fly with them again.
## 1995 Leeds Bradford - Malaga. First time flying with Ryanair and had no problems whatsoever. Made sure boarding cards were printed for both directions before leaving home. Luggage weighed to make sure not over weight before leaving home. Purchased reserved seats with extra legroom and had a comfortable flight. All staff were friendly and helpful.
## 1996 We had no problems flying with Ryanair. Professional about everything. Staff at airport and on the plane were very good. Helpful and so young. The flight was on time both outbound and return. The plane was clean and seats were comfy. Nothing but praise. Will be using Ryanair again. Fuerteventura-Stansted flight FR8183 on 4th October.
## 1997 Rome Ciampino to London Stansted FR3005. Excellent service. For last 8 years I have taken over 60 flights with Ryanair without complaint. During this time I have had the cost of two flights refunded without any quibble (family bereavement). Today I was informed of a rescheduled flight. Ryanair re-booked the 3 members of our party on the alternative flight of our choice with no fuss no extra cost and within a 5 minute phone call.
## 1998 23 September 2013 to Fuerteventura and back again with them on 27th September. After seeing all the bad reviews they get I was very nervous. Its a low cost airline and to be honest it is no different than flying with Thomas Cook or anyone else for that matter. Ok so you don't get inflight movies seats don't recline but I found the whole booking to boarding to flying all very comfortable and easy.
## 1999 My wife and I flew from Bournemouth to Ibiza 24th September returning to Bournemouth on the 1st October 2013. Clean aircraft on both occasions. Very good cabin crews happy and anxious to please. Both flights ahead of arrival times. On the inward flight the Captain saw the majority of passengers using the front steps off the aircraft with a happy word for all. Stop moaning about Ryanair. Stick to the rules and you will enjoy the experience.
## 2000 Seats uncomfortable ridiculous rules which although we adhered to them we could see that others did not. Hot food ran out and staff did not seem to have any comments other than what were likely to have been stock responses it seems if your flight is later in the day it is 'pot luck' if the advertised food is available as it is not replenished between stops! Didn't want to travel with Ryanair but really had no alternative at the time with destination and dates but would avoid in the future.
## 2001 I was catching the morning flight from Barcelona to Rome with 3 other companions. We sat awaiting to board when the call came up. We watched the farce play out as passenger after passenger wrestled with their carry on to shove it into the small regulation box. If they couldn't get it in the little metal box they got fined. As the line finally whittled down we decided to board. They don't turn on the air-conditioning until the plane is in the air. It was then we realised that the seats were not allocated first come first serve. We had to hold our carry on on our laps. I looked above me wondering why we couldn't put our carry on in the overhead compartments. Finally the aircon came on - just about the same time the captain started advertising the sale of scratchcards.
## 2002 Luton (LTN) - Ireland West Knock (NOC) return from Friday to Monday September. Great fares for the return flights. Excellent service as usual on this route. On-time departures and arrival. Attentive and friendly cabin crew. The Ryanair Station Staff at Knock were efficient and professional as well as helpful. My expectations are always met. Fully recommend Ryanair and always look forward to travelling with them.
## 2003 Flew BLL-STN. Flight was almost on time and the value for money was very good. Ryanair dropped the price of the tickets by 60% after I bought them. I am almost fluent in English and have visited more than 10 countries but I could only understand 20% of what was said in the cabin. I could feel my legs 50% of the time and was constantly asked to buy first hot food cold food Standsted express tickets lottery tickets Ryanair mobile and so on! It was really disturbing!
## 2004 Stansted to Rhodes on 14th September 2013 returned on 28th September 2013. Very pleased with everything flight on time easy check in friendly staff lots of leg room in economy would thoroughly recommend no problems at all. First time travelling with Ryanair.
## 2005 Beauvais (Paris) to Bratislava 8 September: the absence of any seat booking as a standard service makes boarding Ryanair feel like a cattle yard experience (we paid the extra for a seat reservation and that worked well). The total inflexibility on luggage weight is a sham and price gouge policy. We are both smallish people our carry on luggage was well under weight and one checked in bag (which of course we paid for) was 1 kg over bang another 20E ie it is per bag if hers was under and mine over you still pay on the one that is over. The flight crew were fine but the check in woman forgot to stamp my wife's boarding document so having gone through the queue we had to run back for that. The airport shuttle service from Porte Maillot to Beauvais was very good but it is 1.5 hrs. Ryanair is now my airline of last resort.
## 2006 Flown this week from Oporto to Barcelona and back. Being a first-time flyer I certainly don't have the experience to compare it with other airlines but I must say I don't get what all the fuss is about. Everyone seems to hate Ryanair and I had a very pleasant experience with them. No troubles with luggage we weren't even asked to measure it or weight it at boarding though I understand that was a stroke of luck. Staff were very polite and nice the only rudeness I witnessed were from the passengers themselves mainly some who had the luck of boarding with clearly oversized bags and then were surprised when they didn't fit in the compartments. Seats were comfortable they are no tighter that the average bus/train seat I was expecting much worse from all the reviews I read. Flights arrived earlier than the quoted time. They do play a lot of ads during the flight for their services but you aren't forced to buy anything and the staff doesn't get all in your face with it. All in all a very pleasant flight. I could have never afforded the trip if it wasn't for Ryanair. Just don't go to one of their flights with your mind set on trying to beat their system. If you want it cheap then you must abide by their rules. If you don't want to be bothered with that just go with the pricier airlines.
## 2007 BGY-DUB return. Reserved seat 1A with priority boarding included. They apply competitive fares. Everything worked properly pleasant flights young and professional crews both ways. Flights on time. Recommended.
## 2008 Flew to Treviso with them from Stansted hopefully will never have to fly with them again. Awful airline most uncomfortable flight seats ever anything over an hours flight on those seats it makes the journey painful. The staff are awful but then again they probably get treated awfully so don't expect them to really care.
## 2009 Ryanair is cheap so you gt what you pay for I use them many times a year I can go home and get away for a cheaper price than a train ticket to London from Manchester. I really don't understand people who don t like it each time I travel the planes are full so they must be doing something right! Don't like the price of the food on board! Don't buy then! Bring your own! No much room for leg! Come on! The journeys are always short how much room do you need for a 2 hr flight! Ryanair is convenient and cheap I am just a bit upset by the fact that some routes are not used in the winter! I fly for business about twice a month and use various airlines from Manchester and to be honest the difference between KLM and Ryanair for example is a free juice a muffin and about 300 quid. The same people moaning on this page will fly Ryanair again because they are the cheapest and people like cheap!
## 2010 Myself wife daughter and her boyfriend went to Paphos Sep 8th. We had no trouble getting through baggage counter .Flight was on time plane very clean and staff very courteous and helpful. As long as you follow Ryanairs rules you should have no problems. Coming back there was a 2hr delay owing to weather conditions over England and the continent something Ryanair could do nothing about. I don't know what you people expect off a low budget airline. Only problems caused were by stupid people with overloaded cases. One especially who could hardly lift his case. I admit I had reservations about travelling with them but would certainly use again. So try it you might like it.
## 2011 We booked with Ryanair due to the reasonable flight take off times printed off the boarding passes at the local library I don't own a printer. The airline offered me the choice of pre-booking a seat as there weren't many left to choose from going by the list of available seat's. Once we got on board only 4 rows were reserved and were told just find a seat after row 5 they are all free. As for coming back from Spain this week all of the Spanish people were pulled out of the long queue and moved to the front. Is it just English people who hate queuing. My girlfriend purchased a wooden gift which weighed no more than 2 pounds and 4 inches wide but it was 5 inches taller than the allowed case height. She had no hand luggage so thought it would be reasonable to take it on board. No it was classed as oversized and the woman in charge having no common sense wanted to charge us the sum of 60 Euro to stick a label on it. Once on board we found several seats still empty. Surely knowing this a bit of lenience would have been used. Where once on board the seat next to us was empty anyway so she had to leave it at the boarding gate. How about teaching common sense in your training.
## 2012 My flight from Dublin to Milan went well. It was the return flight from Rome to Dublin when the nightmare began. The flight was due at 9.00 pm it did not arrive we given no explanation for this. At midnight we were bussed to another airport escorted by Italian police. Then bussed back to the first airport. Finally we flew out at 6pm the next day. I will never fly Ryanair again I will pay the extra money to another airline for a better service.
## 2013 MRS-LTN. The low-cost terminal Ryanair uses in Marseille is absolutely the most depressing building I've ever been in it's reason enough not to fly. Flight was late arriving and departing seat comfort and service obviously nil and a 1 hour wait at the passport control desks at Stansted.
## 2014 I am a woman aged 77 years and I use Ryanair approx 6 times a year to visit my family as I live in France and Ryanair fly to East Midlands. To me it is like using a bus. I follow the instructions on the emails sent to me by Ryanair before my flight and I have never had any problems. The staff have always been courteous and I have noticed helpful when needed. Re people having problems at the airport these are caused by the staff employed by the airport not Ryanair. My only beef is that on one of my flights we had two male flight attendants who were so helpful to an elderly lady who had had a fall in the airport. They could not have been kinder to her and her family.
## 2015 The service is abrupt and very unfriendly. People are treated like second class citizens. Our trip to Treviso was appalling. At one point it was a free for all. No better than a cattle Market. The airline is a disgrace to travel.
## 2016 Like a conveyor belt there is no hospitality from staff. Herded on like cattle as plane was late getting in from previous flight. What really got me was the fact we had paid to have 2 (15kg) cases in the hold but had to have our hand luggage (Sports bag type - a mere 5-6 kilos) crammed under our legs as there was quote 'no room' in the overhead lockers because it is crammed with 10kg luggage cases. So basically we pay and get our legs cramped for over 2 hours and those who don't have priority baggage space and leg space! Must remember that next time if there is a next time. I don't think we got acknowledged from staff at all apart from if we wanted to purchase anything.
## 2017 Travelled for the first time from Stansted to Kos return. Was dubious because of reading poor reviews but we booked extra legroom seats and measured and weighed luggage before we travelled and everything was very smooth. Plane was very clean cabin crew very good and cheerful. Also Ryanair emailed us prior to flight to make sure we were aware of restrictions on baggage etc and also reminding us to print boarding pass. All in all a good experience.
## 2018 Having travelled very recently with Ryanair from Stansted to Dublin I have to say I would avoid travelling with them again. We had checked in online and reserved seats but one of our party had a non-EU passport so as directed on the boarding pass he went to show his passport at the check in desk only to be told that he couldn't fly to Ireland as he didn't have a visa. Would it not be sensible for a warning to come up to notify passengers of this requirement when booking the ticket instead of someone arriving at the airport and being refused boarding! It was the attitude of the girl on the check in desk that was incredulous she was unsympathetic and very rude. Customer care/service obviously not part of her training.
## 2019 Flew Ryanair for the first time in July. Were not aware that reserving a seat gave you priority boarding! Had 3 seats in back row had to board from the front! No room for hand luggage by the time we sat down luckily staff helped out. Seats had little leg room flight to Crete left an hour late! On return got seats with more leg room bliss. Only real nightmare is reserving seats online outside UK. That said fight was cheaper than other airlines and was a new route to the west of the island we were very pleased.
## 2020 We went to Spain from 8th-16th when we booked we had to fork out \302\24350 for 1 suitcase so we had to share! This was the first time I have been with Ryanair and I wont be returning. We didn't have a clue that you had to rush to find a seat on the plane. Once on the flight we had to sit in seats that hadn't been cleaned. On the return we arrived with 1 suitcase and me with 1 hand luggage our suitcase had jumped up to 21kg so it was either pay or throw something out. In the end a towel and a pair of shoes got chucked and we ended up with only 19kg. We bought duty free turns out it takes 1 hour to get through your gate due to the fact you have to fit all duty free in your hand luggage and your hand luggage has to be 10kg or under! I do not recommend at all!
## 2021 I cannot understand why Ryanair allows each passenger to take a carry on bag on board if there is only space for half of them in the overhead locker. The flight attendant stuffed my bag under the seat in front of me and I was very uncomfortable. I chose a nice looking brown bread sandwich from the booklet and of course it was not available. I have to say though that the flight attendants on this flight Paphos - Thessaloniki on 12 Sep 2013 were very friendly. On the way back on Sep 16 2013 the flight was delayed and we finally boarded at 11.00 pm and of course by then I had learned my lesson and ran to the plane to get a space in the overhead locker. The female flight attendant was obviously very tired and huffed and puffed all the way to Paphos If was very visible that she hated her job and all the pax on board. The male flight attendant drank from a water bottle closed the toilet door with his foot and counted the money at the end of the service in the front where all passengers could see.
## 2022 On the way back from Portugal at the airport realised I had no boarding passes and was told the choice was the only way to get back to London was to pay 70 euros each - 2 adults one child it took the seconds to print our tickets. Once we paid up I think was very bad service.
## 2023 I travel with them several times a year. I fly between England and Germany. This year I have travelled with them 4 times. After arriving at Bremen airport today my partner and I entered the queue to hand over her luggage. We had paid an additional 30 EUR the night before in order for her to take one piece of 15kg luggage as it is not included in the Ryanair booking price. My partner was flying to Stansted which is about 40 Miles north of London. After 5 minutes of standing in the queue the Ryanair person working at the desk disappeared and was talking to her friend at the hand luggage and boarding card control desk. I went over and asked her why she was not manning the desk any more and she said "because I only take luggage 40 minutes before take-off". When I said "but we were waiting there and you closed the desk without even telling us" she then lost her patience and got really rude. Subsequently we paid the 60 euros. They call themselves a "no-frills airline" but in effect they are indeed an uncaring "no-service airline". I would give them one star out of 10 for their airport staff. I will not be flying with them again.
## 2024 First time user of Ryanair so to be on the safe side booked seats and got priority boarding. We were very surprised at how smoothly everything went. Coming back from Palma it was obvious the people in front of us had used Ryanair before. They were a couple with two children and had put a large bag on the floor with coats on top and got the youngest child to lay on it. The father had another large bag over his shoulder. The Ryanair staff were walking down the line as we were waiting to board with a box the size of what suitcases were allowed a shand luggage but I never saw them check against anybody's luggage. Some of the so called hand luggage was almost as big as my hold suitcase. After we all boarded a young couple squashed into the extra legroom pretending to let people pass by then were amazed that there was no seats left together so they ended up sitting there. We the ignorant passengers had to pay for our extra leg room.
## 2025 Nothing cheap about Ryanair make a mistake and they make you pay dearly. My family of four missed the flight Stansted to Trieste by being held up by immigration and security rebook flight next day \302\243440 penalty original cost was \302\243220 return flight so do the maths. Being a first time traveller with Ryanair we are from Australia. Ryanair is an experience you don't want to do to often.
## 2026 Ryanair use very small airports Dusseldorf Weez is not anywhere near Dusseldorf (90 km) and public transport is not easily available - very easy to be stranded. Outgoing flight OK return flight airport staff very poor and continuously checking hand luggage for size and weight obviously trying to increase revenue. Flight staff unhelpful and only interested in additional sales booking in very difficult to get right and easy to fall into Ryanair penalties. Consider other airlines before you use this company.
## 2027 Just got back with Ryanair from Spain and not had this problem before but thought I will share what mistake I made. I got a\302\243\302\243100 charge for baggage on return as I did not pay for both ways new one for me as I have always used the same way to book my Ryanair flights and never had this before? I suggest you all look at an alternative flight company as Ryanair yet again stoop lower than a snakes belly to catch even the most loyal of their customers out. I will most definitely not use Ryanair again.
## 2028 Manchester - Palma. Paid for extra leg room which came with priority boarding. Well worth the \302\24315 each way to not stand in the queue to board or worry about not being sat together. The seats are very narrow and each seat is separated by an immovable board so you can not straddle empty seats. Can not understand the reviews of people complaining about getting charged for not having their boarding pass. Ryanair email a week before to tell you that you must check in online. No excuse in the world will get you out of this but you are told by email. They also email you the day before the flight with the hand baggage measurements so no excuses there either. Where they do let themselves down is when the flights are delayed they offered no information whatsoever and there was a four hour wait of everyone staring at the screens. Planes are also often dirty due to them not being cleaned in the short turn around time. As long as you're flying to a proper airport and not a satellite (and end up paying for train/taxi/bus to get 60 miles+ to where you wanted to go!) one then they tend to be the cheapest by a long way as long as you play by the rules. For a 2 hour flight I can get over the lack of service and the slightly uncomfortable seating. Even booking extra leg room they were still 150 quid cheaper than anybody else for return flights.
## 2029 Stansted to Dublin 20th Aug 2013 returning Dublin to Stansted 24th Aug. Stress free flight only a small delay on the return flight. Book reserved seating makes it less of a scramble well worth the \302\24310 per seat.
## 2030 Travelled to Rhodes from Stansted. Coming back was like a cattle market! All crammed into a waiting area so hot people pushing and queue jumping priority went through and some passengers that were not priority pushed their way in and were not stopped what is the point of paying when you can just push in? The aircraft was filthy and I had to sit with my feet in biscuit crumbs crisps bread crusts empty drink bottles - it was disgusting. Even when the seatbelt light was on people kept getting up and fiddling with their luggage. Also when the cabin bags were checked many of them pushed and shoved their bags in the testing rack - so much so that one man pulled his handle off and threw it across the airport floor! This testing of cabin bags does not work as several should have been in the hold but these people wanted to get away with paying and were arguing with the airport staff who jut let them through therefore Ryanair is losing out on payments for luggage and honest passengers are paying the price it needs to be sorted!
## 2031 Took late flight Marseille - Palma on 737 800 with hand luggage only. There were no checks on size or weight. This was the same with a later Vueling flight I took except some of the passengers on that flight had more than one bag and others were plainly oversize! Departure and arrival were both a little late it had plainly been a long day. That said I have no complaints the fare was excellent value the red wine I purchased was not expensive and was good quality. This was my first experience with Ryanair and I am amazed that the fare was only a little more than the taxi fare from the airport into town.
## 2032 Having used Ryanar for the past 3 yrs travelling to Tenerife Gran Canaria and Reus I we can only fully recommend and thank them for their fast efficient service. This is a budget airline and all extras are stated on booking on their website. For all those who wish to pay over the odds eg. extra \302\243700 per family to fly to a destination then book Thomson or Thomas Cook however we used these one way to Reus and had an hour and half delay compared to every flight with Ryanair on time or usually 10 mins early. Some people just like to complain if you have a young family and want to sit together pre book seats or alternatively use Priority Boarding. I only wish Ryanair flew from Cardiff airport as we would save even more travel costs however it is worth the trip to Bristol as you could never fly a family of 4 from Cardiff for \302\243700 to Canaries. Look forward to booking our next trip!
## 2033 Flight Birmingham - Montpellier - Birmingham. People need to remember they get what they pay for - you pay cheap you get cheap and that includes staff crew seats food etc. Do not moan just follow the rules.
## 2034 I flew back from Malaga with Ryanair on 30th August and had no problem whatsoever printed my boarding card as instructed right amount of hand luggage etc. The cabin crew were polite and did their job efficiently. I would not hesitate to book with Ryanair again.
## 2035 Edinburgh - Bordeaux for a week's holiday returning on Saturday 6 September 2013. Ryanair does not when you add it all up save money at all. All the extra charges add up to the point where any saving is completely cancelled out. The staff couldn't care less about customers except as in flight cash cows and clearly the airline is not keen on attracting repeat business!! On both legs we were herded like cattle. Bordeaux luggage collection was unbearably slow and there is no access to toilet facilities in the big shed that passes for a terminal - Ryanair don't have access to the main airport terminal. On the return leg we were kept waiting for 40 minutes standing in a queue to board once again in the big shed with no apology for the delay no air conditioning or fresh air - gruesome!! I cannot see us travelling in this way ever again as it is just too unpleasant for words.
## 2036 There and back from Treviso TSF to Malta MLA last March. Both legs the plane took off late but landed on schedule (with the trumpet-announcement). FAs rude and impolite. No IFE. Flight pleasant thanks to skilled pilots. You're going to pay almost for the air you breathe on board! Anyway acceptable discomforts for such low ticket fare. No doubt whatever its limits are Ryanair helps to move across Europe very cheaply.
## 2037 Flew from Manchester to Sicily we are a family of 8 with 6 children under the age of 12. The flight was fully booked and all 8 of us were located all over the plane even the 2 year old was sat with strangers. Staff were unhelpful and rude there was not enough room for the hand luggage on the plane so all 7 of our cases were put in the hold so we had no food or nappies. Staff were trying to sell things the whole flight we would probably have been better to reserve seats but for 8 people would not have then been a cost effective flight would not go with them again not one case for anyone was checked for either size or weight going to coming back maybe that's why they couldn't fit all the luggage in the cabin!
## 2038 Manchester to Murcia return 15th - 22nd July 2013. I travel very regularly to Spain and I am always very happy with my Ryanair flights. People who moan about such things as size of bags etc annoy me - all the requirements are made very clear at booking. If you don't like it don't book - and probably pay a lot more!
## 2039 Luton airport to Trapani. Flight was on time. Not that cheap after all extras added. Very poor seat comfort. Cabin size bag (used GATE8 Luggage) therefore avoided fees associated with baggage check-in. Staff were at best indifferent.
## 2040 My family flew out with Ryanair to Fuerteventura. From my experience the flight cabin crew and departure and landing was just as good as any other airline we've used. We printed out our boarding passes and check all our luggage was correctly weighted. Had no problems or issues. I would not hesitate to book a flight with Ryanair again. The only complain I had was that the food prices on flight were expensive.
## 2041 Travelled from Palma to Bristol yesterday. Got on the plane after being pushed out of the way by hoards of mad passengers rushing for a seat only to find no seats available. Not a problem generally but when you have a six year old and only single seats available it was a bit tricky. The crew were useless and only seemed interested in pre-booked customers! Got a seat after walking up and down looking lost and no thanks to the crew! No issues going over but not good coming back. Why can't they let the kids on first. All they care about is money. Last time with Ryanair (after using them for years).
## 2042 Prestwick-Wroclaw perfect both ways. Staff spot on landed early. I always arrive early at airport with a cabin bag. Toilet before t/o. No at or drink on flight. Boarding pass always torn half way. good aircraft good crew.
## 2043 Leeds Bradford to Tenerife and back. We read all the instructions stayed within the weight limits and measurements and arrived with the correct number of items of luggage and had no problems at all. Aircraft was clean and tidy staff were efficient and polite. The food and beverages seemed adequate although we did not purchase any. We did not have reserved seats but we sat together on both journeys. My advice just use your common sense and you will find Ryanair as good if not better as any other airline they are efficient and cheap.
## 2044 Flew recently Edinburgh to Bordeaux. Outward was good although had to wait very long one for luggage. Return trip was awful. The new Billi section where the cheap airlines operate is once through security tiny poor toilet facilities and passengers crammed in like sardines. Announcements impossible to hear queues for the gates mingling with people in the shopping areas and once at the gates even tighter than sardines. I understand you have to know what you are doing and what to expect with cheap airlines but I will avoid them if I can in future. This experience was stressful and very uncomfortable. To make things worse the staff on return flight were unfriendly and the food was disgusting!
## 2045 Flew to Alicante last week. Paid the fee for our measly 15kg bag allowance. Checked in online arrived at Edinburgh to depart to find a massive slow moving queue. My 2 year old was getting tired and cranky. Then was told because my bag was 15.5kg and my wife's was 16kg we would be charged \302\243100 for being over weight if we couldn't re-pack. The ignorant woman at check in couldn't care less about our upset child. We managed to get our luggage re-packed and I was told by another member of staff that my bag would be fine at 15.5kg. When getting onto the plane to get or free for all seat rush. My wife asks for assistance to find at least two seats together but the stewardess snootily told her to keep moving up the plane and find a seat. Luckily somebody moved so that she could sit with our child. Then you have to spend the rest of the flight listening to bored and rude cabin crew trying to sell things. Not the greatest start to our 1st family holiday. Have flown with Ryanair before to stags with friends with only hand luggage but will never use them again for a family holiday. They just don't care about their customers or the quality of your journey.
## 2046 We flew up to Scotland with Ryanair and waited for ages to be checked in. The extra cost of printing a boarding pass and check in online was being handed out to a large group of passengers. Why does it cost so much to print a boarding pass and check in at the airport. The staff were rude and unhelpful to the point that I just wanted to get my money back for the flight and go home but - no refunds! If I were to treat people in my business like this I would have no customers. Terrible experience never again!
## 2047 Travelled as a family of 5 3 children 117 and 2. Was dreading flights due to reading reviews - I've got to say if you stick to the guidelines and they do remind you with an e-mail reminding you of cabin bag size weight allowance and to print out boarding passes you can't go wrong. I saw myself the size of the bags people were trying to take on was never hand luggage. I paid to put my luggage in the hold but people were trying it on at the gate to get away with it and Ryanair don't move at all on the rules. I also paid for priority boarding as they only sell this to half of the seats on the plane you are almost guaranteed to sit together peace of mind your boarding 1st to save the bun fight when you get to the gate. Overall I would use them again. Stick within the rules and its not all that bad!
## 2048 Flew first time with Ryanair it was my son's wedding in Poland and crucial we all arrived on time. Excellent service from start to finish. Panic set in when we arrived at security and we had no bar-codes on boarding cards so couldn't be scanned but problem soon sorted by sending us through check in. Cabin crew helpful finding seats and storing bags that wouldn't fit in nearby lockers. Read the rules follow instructions and you won't have any trouble. No excuses as they make the conditions perfectly clear. Shall certainly be travelling with them again.
## 2049 I thought that I was booking a budget airline and accept all that entails however as the final cost once all the 'extras' such as luggage were added I finally paid over 2500 for my families seats and may as well have gone on a better airline. The plane was clean and it took off and arrived on time. If you are travelling on a weekend break for 2 adults then I imagine it wouldn't be a problem just so long as you read all the small print and adhere to them very carefully however with 4 small children and no way to book a seat it was extremely stressful. I do not understand what they gain by using this system! Would go as far as to say that it is immoral that knowing that you cannot take drinks on board they do not supply water and a small bottle of water is \302\2433! Staff were miserable and openly complained about other passengers whilst stood next to me. They enforce the rules when it suits them. They told a lady that she had to put her cardigan in the overhead lockers but the woman next to me had a handbag on her lap. I would rather stay at home then travel with them again.
## 2050 July 2012 Bristol to Tenerife. We are a family of 4 (2 adults and 2 children 10 and 14). We knew that seats weren't allocated but as long as one of our kids was sat with us each we didn't mind. Check in was quick and easy at Bristol as was boarding. Boarding Passes - it clearly states that you have to print them off prior to travelling and you have 14 days to print off your returns if you read the terms and conditions this is quite clear. Yes food and drink is a little expensive but I have never know an airline yet who sell cheap food and drink if you don't like it then buy it in departures prior to boarding. We experience some bad turbulence when landing which meant we had to take off again and land in the North of the Island. After sitting on the tarmac for 30 minutes we were told that buses were waiting for us at the front of the terminal to take us down to Tenerife South other than a little bit of confusion with the staff at the airport this went quite smoothly. People were moaning and complaining about Ryanair and standing in the aisle of the plane when we had all been asked to remain seated until further instructions were given but all I can say is I was happy to land safely rather than Ryanair attempting to land in such bad conditions and put everyone at risk! Staff were friendly enough the return flight was good and they got us back slightly earlier than planned. The plane did not seem anymore uncomfortable than others we have travelled on and it was clean. Lastly if you have young children I recommend you pay for priority boarding or make every effort to get to the front of the queue before boarding if you all want to sit together.
## 2051 Ryanair is good for its destinations the small airports closer to where you want to go. In the bigger airports their slots are obviously the cheapest and therefore the most inconvenient for passengers. The flights are cramped and the boarding process is very slow. Staff are often pleasant. The flights are not necessarily the cheapest; in domestic Spanish flights for instance by the time you have added a reserved seat and luggage in the hold you can travel cheaper and more comfortably with Iberia or Air Europa. Flights from Spain however to Baden Airpark or Ancona for instance are convenient because they are not routed through hubs with long conveyor belt waiting-times and one can often find an airport close to one's destination.
## 2052 Bristol - Malaga. Return flight was booked for family of 4 with 2 bags checked in (already charged \302\243100 for privilege of taking 2 hold bags). For the return my wife had to leave a few days early due to unforeseen circumstances so she departed on a different flight from Seville. At Malaga airport tried to check in with the 2 kids and 2 bags - only to be told had to pay an extra 100 Euros on the spot to 'transfer' one of the bags from my wife to one of the children. Otherwise would not be able to take it. Means I paid approx \302\243130 for the one suitcase plus \302\24350 for the other. Absolute rip off; and the flights were not exactly cheap even before the add-ons. Will never be flying Ryanair again.
## 2053 I have flown with Ryanair many times and have just returned from Lanzarote flying out of East Midlands I cannot fault the service whatsoever. What I have noticed the same problems occur time and time again. People don't read the rules you don't get something for nothing you know that with Ryanair - accept it. Why do people with children think they have the right to complain when they saunter on to the plane at the last minute and wonder why the are unable to sit together. People get to the check and have to start unpacking cases because they cant be bothered to weigh there luggage. Ryanair is the cheapest not the best I accept that but most of the problems I have seen are caused by the passengers themselves.
## 2054 Definitely not for flying with small children. I flew to Poland with my nearly 3 months old daughter and got no help from staff whatsoever. I paid for seat for my little girl however was expected to keep her on my lap as she wasn't allowed to have her own. It would be great if I could just lay her down surely we would both be more comfortable. Also women with kids or pregnant get no priority at the boarding gates staff are rude and treated us as a load not a human beings talking down to us. At the end of the day we are paying customers so show us some respect! Will not fly with them again.
## 2055 My first Ryanair flight was Manchester to Memmingham. What really annoyed me was that my wife and I seemed to be the only people to follow the cabin baggage rules! Everyone else had huge rucksacks that were no way acceptable - and nobody checked at either end! As for families with children and push chairs (have you seen the size of them nowadays) I would ban them from cabins at any price. One saving grace however was that seat backs are fixed in the upright position. Will I travel again with them. Probably yes as it is cheaper than Swissair to Zurich.
## 2056 Ryanair informed me that my flights from Liverpool to Rimini had been cancelled 3 months ago only 3 weeks before I was meant to fly. I ended up having to stay at home and lost parking and hotel deposit. Since June I have my flights to Rimini from Stansted booked and confirmed for Christmas. My family who live in Rimini have just informed me that Ryanair is stopping flying there from September so I phoned customer service to find out. I was told yes it was true and asked if I wanted a refund. Is that all you've got to say I inquired. After a long silence I was asked again if I wanted a refund; there was no explanation. To summarize Ryanair know that they are not going to fly into Rimini at Christmas but have no intention on informing the poor passengers who are looking forward to being there for Christmas. Not only they are holding on to everyone's money. They will hold you to ransom nearer the time leaving you no choice but to fly to Bologna or Ancona at inflated prices.
## 2057 I flew recently from Manchester to Bremen in Germany and am already a regular Ryanair passenger. As always the service worked perfectly. We arrived a few minutes late but I do not think 10 mins matters. Staff are always pleasant if a little unconcerned. I feel a little sorry for them having to sell lottery tickets but it does keep the prices down. I have never incurred charges as I read the rules.
## 2058 Our flight from Limoges France to Stansted was cancelled due to poor weather although other planes including Ryanair flights were able to come and go. The next flight from Limoges to Stansted with availability was 3 days later. So we accepted a flight to Leeds the following day. That was all that was done for us we had to arrange our own overnight accommodation transport to and from the airport etc. My advice is if you travel with Ryanair: Make sure you have access to the internet because you need to react pretty quickly when the flight is cancelled as the airports are usually in the middle of nowhere. Know the location of the other airports Ryanair operate. We were offered a flight from Bergerac the next day but the airport staff could not tell us how to get there by train. Don't book stuff for the day after your arrival. There were people in the queue with connecting flights tickets for the Olympics that they could not use. Based on the above I would not travel again with Ryanair if I was travelling to a tight schedule. In total we got home 26 hrs after we planned.
## 2059 Flying out of Manchester staff friendly and helpful coming back through Palma a different matter. My hand luggage that was the right size going out was deemed to be too large when I was flying home and I was forced to pay \342\202\25450 and put it in hold leaving me without my pain medication. The priority boarding I had paid for was non existent traveling with small children they tried to split us up eventually got seats together near emergency exit! To add insult to injury they had no food apart from sweets and crisps.
## 2060 Myself and my daughter took a holiday to Kos. I have never seen such a shambles in my life. After the experience of the free for all to get your seats and then seeing the arguments between other passengers as they could not sit together got the holiday off to a great start. It was now the time for the safety announcements prior to take off I do understand that this is important however I have never seen such miserable faces from the cabin staff. We were sitting in row five and it took nearly 1hr to get served I think mainly because they had to keep explaining what they had run out of even before we took off. The list was endless of what they hadn't got. When it was our turn I ordered 1 bottle of water a whisky and a can of coke I was taken back a little when they said that's 11 Euros. I quickly put my money back in my pocket. All they wanted to do was to sell scratch cards and smokeless cigarettes. Overall not impressed at all and will never travel Ryanair in the future. One final thing. Budget airline? My tickets where certainly not cheap or even reasonable.
## 2061 Stansted to Pula. Tried to adhere to all rules and regulations but failed to print boarding passes for return journey and hence fined \342\202\254240 for family of four. This was a genuine error caused by my printing off the outbound boarding passes at too early a stage in my eagerness to do all correctly at which time unable to print for return. Erroneously assumed outbound copies and itinerary would suffice. Hold my hands up and agree nominal fine should be payable but believe that \342\202\25460 per person is totally disproportionate to administration involved for the error. Walked 5 metres handed over credit card and after a minutes transaction and \342\202\254240 pound payment returned to check in and allowed to board! Expensive lesson learnt but will avoid Ryanair from now on!
## 2062 When printing the boarding tickets we got our outboard flight no problem and when the home flight boarding card would not print we thought it was due to not actually being away. On our way home the check in lady at Malta said it was going to cost us 290 euros to get home due to no boarding cards even though in front of her on a check list were all the names of passengers and their luggage. After several words and a lot of shouting I paid the money having no other choice. This airline ruined a holiday that was otherwise brilliant and showed no remorse to me and several other unfortunate passengers. This will never happen again because I will never use them again.
## 2063 Budapest - Manchester and back again with a 5 month old and a 7 year old. Budget flying is fine I was lucky enough to sit in the aisle seat with my baby and my 7 year old sat on the other side of the aisle. I even paid for priority boarding on the way back to give myself just 3 minutes to find a seat next to my own child and get my bags and it made no difference. They put the gate number up people run to the gate 12 minutes walk away they start boarding and I am still trying to push the pram to the gate. A fellow passenger kindly offered to hold my baby while I collapsed the pram at the bottom of the stairs. I still struggled to get on and get seated people pushing past me. I will be seeking my money back for 'priority boarding'. If you have a small child or infant it is not worth it. I flew long haul from Australia with a baby and 7 year old 27 hours worth of traveling and not once felt as stressed and helpless as I did flying Ryanair.
## 2064 Stansted to Barcelona. Fine going there. Horrendous treatment on boarding for the return flight. My daughters under 16 years of age were summoned to pay 50 euros each for their hand luggage even though the cases fit the dimensions specified. Staff started to process the \302\24350 fines without asking for their ages or to speak with their parent then demanded payment. Really put a dampener on the whole trip. First and last time we fly with Ryanair.
## Aircraft Type.Of.Traveller Seat.Type
## 1 Boeing 737 900 Family Leisure Economy Class
## 2 Unknown Couple Leisure Economy Class
## 3 Boeing 737-800 Couple Leisure Economy Class
## 4 Boeing 737 Solo Leisure Economy Class
## 5 Boeing 737-800 Solo Leisure Economy Class
## 6 Unknown Solo Leisure Economy Class
## 7 Boeing 737 Business Economy Class
## 8 Unknown Solo Leisure Economy Class
## 9 Unknown Couple Leisure Economy Class
## 10 Boeing 737Max Business Economy Class
## 11 Unknown Family Leisure Economy Class
## 12 Unknown Couple Leisure Economy Class
## 13 Unknown Couple Leisure Economy Class
## 14 Boeing 737 800 Solo Leisure Economy Class
## 15 Boeing 737-800 Solo Leisure Economy Class
## 16 Unknown Solo Leisure Economy Class
## 17 Boeing 737 Business Economy Class
## 18 Unknown Solo Leisure Economy Class
## 19 Unknown Couple Leisure Economy Class
## 20 Unknown Couple Leisure Economy Class
## 21 Unknown Couple Leisure Economy Class
## 22 Unknown Family Leisure Economy Class
## 23 Unknown Couple Leisure Economy Class
## 24 Boeing 737-8200 Solo Leisure Economy Class
## 25 Unknown Solo Leisure Economy Class
## 26 Boeing 737-800 Family Leisure Economy Class
## 27 B733-8022 Couple Leisure Economy Class
## 28 Unknown Couple Leisure Economy Class
## 29 Boeing 737 800 Business Economy Class
## 30 Boeing 737-800 Solo Leisure Economy Class
## 31 Unknown Couple Leisure Economy Class
## 32 Boeing 347 Couple Leisure Economy Class
## 33 Unknown Couple Leisure Economy Class
## 34 Boeing 737-800 Solo Leisure Economy Class
## 35 Unknown Family Leisure Economy Class
## 36 Unknown Couple Leisure Economy Class
## 37 Boeing 737-800 Family Leisure Economy Class
## 38 Unknown Family Leisure Economy Class
## 39 Unknown Solo Leisure Economy Class
## 40 Boeing 737-800 Solo Leisure Economy Class
## 41 Boeing 737-800 Couple Leisure Economy Class
## 42 Boeing 737 max Family Leisure Economy Class
## 43 Unknown Family Leisure Economy Class
## 44 Unknown Family Leisure Economy Class
## 45 Unknown Couple Leisure Economy Class
## 46 Unknown Solo Leisure Economy Class
## 47 Boeing 737-10 Solo Leisure Economy Class
## 48 Unknown Couple Leisure Economy Class
## 49 Unknown Solo Leisure Economy Class
## 50 B737 Couple Leisure Economy Class
## 51 Unknown Couple Leisure Economy Class
## 52 Unknown Couple Leisure Economy Class
## 53 Unknown Business Economy Class
## 54 Unknown Solo Leisure Economy Class
## 55 Unknown Family Leisure Economy Class
## 56 Unknown Solo Leisure Economy Class
## 57 Boeing 737-800 Couple Leisure Economy Class
## 58 Unknown Couple Leisure Economy Class
## 59 Unknown Couple Leisure Economy Class
## 60 Boeing 737-800 Couple Leisure Economy Class
## 61 Boeing 737-800 Solo Leisure Economy Class
## 62 Unknown Couple Leisure Economy Class
## 63 Boeing 737 Max 8 Couple Leisure Economy Class
## 64 Unknown Family Leisure Economy Class
## 65 Unknown Family Leisure Economy Class
## 66 Unknown Family Leisure Premium Economy
## 67 Unknown Business Economy Class
## 68 Unknown Couple Leisure Economy Class
## 69 Unknown Solo Leisure Economy Class
## 70 Boeing 737 Solo Leisure Economy Class
## 71 Unknown Family Leisure Economy Class
## 72 Unknown Family Leisure Economy Class
## 73 Boeing 737-800 Couple Leisure Economy Class
## 74 Boeing 737-800 Solo Leisure Economy Class
## 75 Unknown Solo Leisure Economy Class
## 76 Unknown Couple Leisure Economy Class
## 77 Unknown Couple Leisure Economy Class
## 78 Unknown Solo Leisure Economy Class
## 79 Unknown Solo Leisure Economy Class
## 80 737 800 Couple Leisure Premium Economy
## 81 Boeing 737 Couple Leisure Economy Class
## 82 Unknown Couple Leisure Economy Class
## 83 Boeing 737 Couple Leisure Economy Class
## 84 Unknown Couple Leisure Economy Class
## 85 Unknown Family Leisure Economy Class
## 86 Unknown Couple Leisure Economy Class
## 87 Boeing 737 MAX Couple Leisure Economy Class
## 88 Boeing 737-800 Couple Leisure Economy Class
## 89 Boeing 737-8AS Solo Leisure Economy Class
## 90 Boeing 737-8AS Solo Leisure Economy Class
## 91 Unknown Solo Leisure Economy Class
## 92 Unknown Business Economy Class
## 93 A320 Solo Leisure Economy Class
## 94 Boeing 737-800 Solo Leisure Economy Class
## 95 Boeing 737-800 Solo Leisure Economy Class
## 96 Unknown Solo Leisure Economy Class
## 97 Unknown Couple Leisure Economy Class
## 98 Unknown Couple Leisure Economy Class
## 99 Unknown Couple Leisure Economy Class
## 100 Boeing 737 MAX 8-200 Family Leisure Economy Class
## 101 Boeing 737-800 Family Leisure Economy Class
## 102 Boeing 737 Couple Leisure Economy Class
## 103 Unknown Couple Leisure Economy Class
## 104 Unknown Family Leisure Economy Class
## 105 Unknown Family Leisure Economy Class
## 106 Unknown Couple Leisure Economy Class
## 107 A320 Solo Leisure Economy Class
## 108 Unknown Solo Leisure Premium Economy
## 109 Unknown Solo Leisure Economy Class
## 110 Unknown Couple Leisure Economy Class
## 111 Unknown Couple Leisure Economy Class
## 112 Boeing 737 Solo Leisure Economy Class
## 113 Unknown Couple Leisure Economy Class
## 114 Unknown Couple Leisure Economy Class
## 115 Boeing 737-800 Couple Leisure Economy Class
## 116 Unknown Couple Leisure Economy Class
## 117 Boeing 737 Max Solo Leisure Economy Class
## 118 Boeing 737-800 Solo Leisure Economy Class
## 119 Unknown Family Leisure Economy Class
## 120 Boeing 737 Solo Leisure Economy Class
## 121 Boeing 738 Solo Leisure Economy Class
## 122 Unknown Solo Leisure Economy Class
## 123 Boeing 737-800 Couple Leisure Economy Class
## 124 Unknown Couple Leisure Economy Class
## 125 Boeing 737-800 Family Leisure Economy Class
## 126 Unknown Business Economy Class
## 127 Unknown Solo Leisure Economy Class
## 128 Unknown Couple Leisure Economy Class
## 129 Unknown Couple Leisure Economy Class
## 130 Boeing 737-800 Solo Leisure Economy Class
## 131 Boeing 737 MAX Solo Leisure Economy Class
## 132 Boeing 737 Solo Leisure Economy Class
## 133 Boeing 737 Solo Leisure Economy Class
## 134 Unknown Family Leisure Economy Class
## 135 Boeing 737 Family Leisure Economy Class
## 136 Unknown Solo Leisure Economy Class
## 137 Boeing 737-800 Couple Leisure Economy Class
## 138 Unknown Solo Leisure Economy Class
## 139 Boeing 737 Family Leisure Economy Class
## 140 Boeing 737-800 Business Economy Class
## 141 Unknown Solo Leisure Economy Class
## 142 Unknown Couple Leisure Economy Class
## 143 Boeing 737 Solo Leisure Economy Class
## 144 Unknown Family Leisure Economy Class
## 145 Boeing 737 Solo Leisure Economy Class
## 146 Boeing 737 Solo Leisure Economy Class
## 147 Unknown Couple Leisure Economy Class
## 148 Unknown Family Leisure Economy Class
## 149 Boeing 737 Solo Leisure Economy Class
## 150 Boeing 737-800 Couple Leisure Economy Class
## 151 Unknown Couple Leisure Economy Class
## 152 Unknown Solo Leisure Economy Class
## 153 Unknown Couple Leisure Economy Class
## 154 Boeing 737 Solo Leisure Economy Class
## 155 Unknown Family Leisure Economy Class
## 156 Unknown Couple Leisure Economy Class
## 157 Unknown Business Economy Class
## 158 Unknown Couple Leisure Economy Class
## 159 Unknown Couple Leisure Economy Class
## 160 Boeing 737-800 Couple Leisure Economy Class
## 161 Unknown Couple Leisure Economy Class
## 162 Unknown Solo Leisure Economy Class
## 163 Unknown Family Leisure Economy Class
## 164 Boeing 737max Couple Leisure Economy Class
## 165 Boeing 737 Solo Leisure Economy Class
## 166 Unknown Family Leisure Economy Class
## 167 Boeing 737 Solo Leisure Economy Class
## 168 Boeing 737 Family Leisure Economy Class
## 169 Boeing 737-800 Family Leisure Economy Class
## 170 Unknown Solo Leisure Economy Class
## 171 Unknown Solo Leisure Economy Class
## 172 Unknown Family Leisure Economy Class
## 173 Unknown Family Leisure Economy Class
## 174 Unknown Business Economy Class
## 175 Unknown Couple Leisure Economy Class
## 176 Unknown Solo Leisure Economy Class
## 177 Unknown Couple Leisure Economy Class
## 178 Unknown Couple Leisure Economy Class
## 179 Unknown Family Leisure Economy Class
## 180 Boeing 737 Business Economy Class
## 181 Unknown Family Leisure Economy Class
## 182 Unknown Solo Leisure Economy Class
## 183 Boeing 737 Solo Leisure Economy Class
## 184 Unknown Family Leisure Economy Class
## 185 Unknown Couple Leisure Economy Class
## 186 Unknown Family Leisure Economy Class
## 187 Unknown Couple Leisure Economy Class
## 188 Unknown Family Leisure Economy Class
## 189 Unknown Family Leisure Economy Class
## 190 Unknown Couple Leisure Economy Class
## 191 Unknown Business Economy Class
## 192 Unknown Family Leisure Economy Class
## 193 Unknown Family Leisure Economy Class
## 194 Unknown Solo Leisure Economy Class
## 195 Unknown Solo Leisure Economy Class
## 196 Unknown Couple Leisure Economy Class
## 197 Unknown Couple Leisure Economy Class
## 198 Unknown Business Economy Class
## 199 Unknown Solo Leisure Economy Class
## 200 Unknown Family Leisure Economy Class
## 201 Boeing 737-800 Couple Leisure Economy Class
## 202 Boeing 737-800 Family Leisure Economy Class
## 203 Unknown Family Leisure Economy Class
## 204 Unknown Couple Leisure Economy Class
## 205 Unknown Solo Leisure Economy Class
## 206 Unknown Family Leisure Economy Class
## 207 Unknown Family Leisure Economy Class
## 208 Unknown Family Leisure Economy Class
## 209 Boeing 737-800 NG Family Leisure Economy Class
## 210 Unknown Couple Leisure Economy Class
## 211 Unknown Couple Leisure Economy Class
## 212 Unknown Couple Leisure Economy Class
## 213 Unknown Solo Leisure Economy Class
## 214 Unknown Family Leisure Economy Class
## 215 Unknown Couple Leisure Economy Class
## 216 Boeing 737-800 Couple Leisure Economy Class
## 217 Unknown Couple Leisure Economy Class
## 218 Unknown Family Leisure Economy Class
## 219 Boeing 737-800 Solo Leisure Economy Class
## 220 Boeing 737-800 Solo Leisure Economy Class
## 221 Unknown Solo Leisure Economy Class
## 222 B737 Couple Leisure Economy Class
## 223 Boeing 737-800 Business Economy Class
## 224 Unknown Couple Leisure Economy Class
## 225 Unknown Couple Leisure Economy Class
## 226 Unknown Solo Leisure Economy Class
## 227 Boeing 737-800 Solo Leisure Economy Class
## 228 Unknown Business Economy Class
## 229 Unknown Couple Leisure Economy Class
## 230 Unknown Family Leisure Economy Class
## 231 Unknown Family Leisure Economy Class
## 232 Unknown Solo Leisure Economy Class
## 233 Unknown Solo Leisure Economy Class
## 234 Unknown Solo Leisure Economy Class
## 235 Unknown Family Leisure Economy Class
## 236 Unknown Solo Leisure Economy Class
## 237 Unknown Family Leisure Economy Class
## 238 Unknown Family Leisure Economy Class
## 239 Unknown Solo Leisure Economy Class
## 240 Boeing 737 Couple Leisure Economy Class
## 241 Unknown Family Leisure Economy Class
## 242 Unknown Solo Leisure Economy Class
## 243 Unknown Couple Leisure Economy Class
## 244 Unknown Solo Leisure Economy Class
## 245 Unknown Solo Leisure Economy Class
## 246 Boeing 747-400 Couple Leisure Economy Class
## 247 Unknown Family Leisure Economy Class
## 248 Unknown Business Economy Class
## 249 Boeing 737-800 Family Leisure Economy Class
## 250 A320 Solo Leisure Economy Class
## 251 Unknown Couple Leisure Economy Class
## 252 Unknown Couple Leisure Economy Class
## 253 Unknown Business Economy Class
## 254 Unknown Couple Leisure Economy Class
## 255 Unknown Couple Leisure Premium Economy
## 256 Unknown Family Leisure Economy Class
## 257 Unknown Couple Leisure Economy Class
## 258 737 800 Solo Leisure Economy Class
## 259 Unknown Couple Leisure Economy Class
## 260 Unknown Business Economy Class
## 261 Boeing 737-800 Family Leisure Economy Class
## 262 Unknown Couple Leisure Economy Class
## 263 Unknown Couple Leisure Economy Class
## 264 Unknown Solo Leisure Economy Class
## 265 Unknown Solo Leisure Economy Class
## 266 Unknown Couple Leisure Economy Class
## 267 Unknown Family Leisure Economy Class
## 268 Unknown Couple Leisure Economy Class
## 269 Unknown Solo Leisure Economy Class
## 270 Unknown Solo Leisure Economy Class
## 271 Unknown Solo Leisure Economy Class
## 272 Boeing 737 Solo Leisure Economy Class
## 273 Unknown Solo Leisure Economy Class
## 274 Unknown Family Leisure Economy Class
## 275 Unknown Couple Leisure Economy Class
## 276 Unknown Couple Leisure Economy Class
## 277 Unknown Solo Leisure Economy Class
## 278 Boeing 737 Couple Leisure Economy Class
## 279 Boeing 737-800 Business Economy Class
## 280 Unknown Solo Leisure Economy Class
## 281 Unknown Solo Leisure Economy Class
## 282 Unknown Family Leisure Economy Class
## 283 Unknown Couple Leisure Economy Class
## 284 Unknown Solo Leisure Economy Class
## 285 Unknown Solo Leisure Economy Class
## 286 Unknown Business Economy Class
## 287 Unknown Solo Leisure Economy Class
## 288 Boeing 737-800 Solo Leisure Economy Class
## 289 Unknown Couple Leisure Economy Class
## 290 Unknown Solo Leisure Economy Class
## 291 Unknown Solo Leisure Economy Class
## 292 Boeing 737-800 Couple Leisure Economy Class
## 293 Unknown Couple Leisure Economy Class
## 294 Unknown Family Leisure Economy Class
## 295 Unknown Solo Leisure Economy Class
## 296 Unknown Business Economy Class
## 297 Boeing 737-800 Couple Leisure Economy Class
## 298 Boeing 737-800 Family Leisure Economy Class
## 299 Unknown Solo Leisure Economy Class
## 300 Unknown Couple Leisure Economy Class
## 301 Unknown Couple Leisure Economy Class
## 302 Unknown Family Leisure Economy Class
## 303 Unknown Solo Leisure Economy Class
## 304 Unknown Family Leisure Economy Class
## 305 Unknown Solo Leisure Economy Class
## 306 Unknown Couple Leisure Economy Class
## 307 Unknown Family Leisure Economy Class
## 308 Unknown Solo Leisure Economy Class
## 309 Boeing 737-800 Solo Leisure Economy Class
## 310 Boeing 737 Couple Leisure Economy Class
## 311 Boeing 737-800 Solo Leisure Economy Class
## 312 Unknown Couple Leisure Economy Class
## 313 Unknown Solo Leisure Economy Class
## 314 Unknown Family Leisure Economy Class
## 315 Unknown Family Leisure Economy Class
## 316 Unknown Family Leisure Economy Class
## 317 Unknown Solo Leisure Economy Class
## 318 Unknown Couple Leisure Economy Class
## 319 Unknown Family Leisure Economy Class
## 320 Unknown Couple Leisure Economy Class
## 321 Boeing 737 800 Solo Leisure Economy Class
## 322 Unknown Business Economy Class
## 323 Unknown Family Leisure Economy Class
## 324 Unknown Couple Leisure Economy Class
## 325 Unknown Couple Leisure Economy Class
## 326 Unknown Solo Leisure Economy Class
## 327 Unknown Solo Leisure Economy Class
## 328 Unknown Solo Leisure Economy Class
## 329 Boeing 737 Solo Leisure Economy Class
## 330 Unknown Couple Leisure Economy Class
## 331 Unknown Solo Leisure Economy Class
## 332 Unknown Family Leisure Economy Class
## 333 Unknown Solo Leisure Economy Class
## 334 Unknown Couple Leisure Economy Class
## 335 Unknown Couple Leisure Economy Class
## 336 Boeing 737 Family Leisure Economy Class
## 337 Boeing 737 Couple Leisure Economy Class
## 338 Unknown Couple Leisure Economy Class
## 339 Boeing 737 Solo Leisure Economy Class
## 340 Unknown Couple Leisure Economy Class
## 341 Unknown Solo Leisure Economy Class
## 342 Unknown Solo Leisure Economy Class
## 343 Unknown Couple Leisure Economy Class
## 344 Unknown Business Economy Class
## 345 Unknown Solo Leisure Economy Class
## 346 Unknown Family Leisure Economy Class
## 347 Unknown Family Leisure Economy Class
## 348 Unknown Solo Leisure Economy Class
## 349 Unknown Solo Leisure Economy Class
## 350 Boeing 737 Solo Leisure Economy Class
## 351 Unknown Couple Leisure Economy Class
## 352 Unknown Couple Leisure Economy Class
## 353 Unknown Couple Leisure Economy Class
## 354 Unknown Family Leisure Economy Class
## 355 Unknown Solo Leisure Economy Class
## 356 Boeing 737-800 Family Leisure Economy Class
## 357 Unknown Solo Leisure Economy Class
## 358 Unknown Solo Leisure Economy Class
## 359 Unknown Couple Leisure Economy Class
## 360 Boeing 737-800 Solo Leisure Economy Class
## 361 Unknown Couple Leisure Economy Class
## 362 Unknown Solo Leisure Economy Class
## 363 Unknown Family Leisure Economy Class
## 364 Unknown Couple Leisure Economy Class
## 365 Unknown Business Economy Class
## 366 Unknown Solo Leisure Economy Class
## 367 Unknown Solo Leisure Economy Class
## 368 Unknown Couple Leisure Economy Class
## 369 Unknown Solo Leisure Economy Class
## 370 Unknown Couple Leisure Economy Class
## 371 Unknown Family Leisure Economy Class
## 372 Boeing 737-800 Couple Leisure Economy Class
## 373 Boeing 737 Business Economy Class
## 374 Unknown Solo Leisure Economy Class
## 375 Unknown Solo Leisure Economy Class
## 376 Unknown Couple Leisure Economy Class
## 377 Unknown Family Leisure Economy Class
## 378 Boeing 737-800 Couple Leisure Economy Class
## 379 Unknown Couple Leisure Economy Class
## 380 Unknown Couple Leisure Economy Class
## 381 Unknown Business Economy Class
## 382 Boeing 737-800 Solo Leisure Economy Class
## 383 Unknown Solo Leisure Economy Class
## 384 Boeing 737 Family Leisure Economy Class
## 385 Unknown Couple Leisure Economy Class
## 386 Boeing 737-800 Couple Leisure Economy Class
## 387 Unknown Family Leisure Economy Class
## 388 Boeing 737-800 Solo Leisure Economy Class
## 389 Unknown Business Economy Class
## 390 Boeing 737-800 Business Economy Class
## 391 Boeing 738 Business Economy Class
## 392 Unknown Solo Leisure Economy Class
## 393 Unknown Couple Leisure Economy Class
## 394 Unknown Solo Leisure Economy Class
## 395 Unknown Couple Leisure Economy Class
## 396 Boeing 737-800 Solo Leisure Economy Class
## 397 Unknown Couple Leisure Economy Class
## 398 Unknown Couple Leisure Economy Class
## 399 Unknown Couple Leisure Economy Class
## 400 Unknown Family Leisure Economy Class
## 401 Unknown Family Leisure Economy Class
## 402 Unknown Couple Leisure Economy Class
## 403 Boeing 737-800 Solo Leisure Economy Class
## 404 Unknown Solo Leisure Economy Class
## 405 Unknown Couple Leisure Economy Class
## 406 Unknown Couple Leisure Economy Class
## 407 Boeing 737 Couple Leisure Economy Class
## 408 Unknown Business Economy Class
## 409 Unknown Solo Leisure Economy Class
## 410 Unknown Couple Leisure Economy Class
## 411 Unknown Couple Leisure Economy Class
## 412 Unknown Couple Leisure Economy Class
## 413 Unknown Couple Leisure Economy Class
## 414 Unknown Couple Leisure Economy Class
## 415 Unknown Couple Leisure Economy Class
## 416 Unknown Solo Leisure Economy Class
## 417 Unknown Couple Leisure Economy Class
## 418 Unknown Couple Leisure Economy Class
## 419 Unknown Family Leisure Economy Class
## 420 Unknown Family Leisure Economy Class
## 421 Unknown Couple Leisure Economy Class
## 422 Unknown Solo Leisure Economy Class
## 423 Unknown Family Leisure Economy Class
## 424 Unknown Couple Leisure Economy Class
## 425 Unknown Couple Leisure Economy Class
## 426 Boeing 737-800 Family Leisure Economy Class
## 427 Boeing 737-800 Family Leisure Economy Class
## 428 Boeing 737-800 Solo Leisure Economy Class
## 429 Unknown Solo Leisure Economy Class
## 430 Unknown Family Leisure Economy Class
## 431 Boeing 737-800 Couple Leisure Economy Class
## 432 Boeing 737 Solo Leisure Economy Class
## 433 Unknown Solo Leisure Economy Class
## 434 Boeing 737 Couple Leisure Economy Class
## 435 Unknown Couple Leisure Economy Class
## 436 Boeing 737-800 Solo Leisure Economy Class
## 437 Boeing 737-800 Solo Leisure Economy Class
## 438 Unknown Solo Leisure Economy Class
## 439 Unknown Couple Leisure Economy Class
## 440 Boeing 737-800 Solo Leisure Economy Class
## 441 Unknown Business Economy Class
## 442 Unknown Couple Leisure Economy Class
## 443 Unknown Family Leisure Economy Class
## 444 Unknown Couple Leisure Economy Class
## 445 Unknown Solo Leisure Economy Class
## 446 Unknown Family Leisure Economy Class
## 447 Unknown Couple Leisure Economy Class
## 448 Unknown Couple Leisure Economy Class
## 449 Unknown Solo Leisure Economy Class
## 450 Unknown Business Economy Class
## 451 Unknown Solo Leisure Economy Class
## 452 Unknown Couple Leisure Economy Class
## 453 Boeing 737 Couple Leisure Economy Class
## 454 Unknown Family Leisure Economy Class
## 455 Unknown Couple Leisure Economy Class
## 456 Unknown Solo Leisure Economy Class
## 457 Unknown Family Leisure Economy Class
## 458 Unknown Couple Leisure Economy Class
## 459 Unknown Family Leisure Economy Class
## 460 Unknown Couple Leisure Economy Class
## 461 Boeing 737 Couple Leisure Economy Class
## 462 Boeing 737 Couple Leisure Economy Class
## 463 Boeing 737 Couple Leisure Economy Class
## 464 Unknown Solo Leisure Economy Class
## 465 Unknown Solo Leisure Economy Class
## 466 Unknown Solo Leisure Economy Class
## 467 Boeing 737-800 Family Leisure Economy Class
## 468 Unknown Family Leisure Economy Class
## 469 Unknown Couple Leisure Economy Class
## 470 Boeing 737 Solo Leisure Economy Class
## 471 Unknown Business Economy Class
## 472 Unknown Couple Leisure Economy Class
## 473 Unknown Family Leisure Economy Class
## 474 Unknown Couple Leisure Economy Class
## 475 Boeing 737 Solo Leisure Economy Class
## 476 Unknown Solo Leisure Economy Class
## 477 Boeing 737-800 Solo Leisure Economy Class
## 478 Unknown Couple Leisure Economy Class
## 479 Unknown Solo Leisure Economy Class
## 480 Unknown Couple Leisure Premium Economy
## 481 Unknown Couple Leisure Economy Class
## 482 Unknown Solo Leisure Economy Class
## 483 Unknown Solo Leisure Economy Class
## 484 Unknown Family Leisure Economy Class
## 485 Unknown Couple Leisure Economy Class
## 486 Unknown Couple Leisure Economy Class
## 487 Unknown Solo Leisure Economy Class
## 488 Unknown Couple Leisure Economy Class
## 489 Boeing 373-800 Solo Leisure Economy Class
## 490 Unknown Family Leisure Economy Class
## 491 Unknown Family Leisure Economy Class
## 492 Unknown Family Leisure Economy Class
## 493 Unknown Family Leisure Economy Class
## 494 Unknown Solo Leisure Economy Class
## 495 Unknown Solo Leisure Economy Class
## 496 Unknown Couple Leisure Economy Class
## 497 Unknown Family Leisure Economy Class
## 498 Unknown Couple Leisure Economy Class
## 499 Unknown Solo Leisure Economy Class
## 500 Unknown Family Leisure Economy Class
## 501 Unknown Solo Leisure Economy Class
## 502 Unknown Family Leisure Economy Class
## 503 Unknown Family Leisure Economy Class
## 504 Unknown Family Leisure Economy Class
## 505 Unknown Family Leisure Economy Class
## 506 Unknown Solo Leisure Premium Economy
## 507 Unknown Couple Leisure Economy Class
## 508 Bowen 737 Solo Leisure Economy Class
## 509 Unknown Family Leisure Economy Class
## 510 Unknown Couple Leisure Economy Class
## 511 Unknown Solo Leisure Economy Class
## 512 Unknown Couple Leisure Economy Class
## 513 Unknown Business Premium Economy
## 514 Unknown Couple Leisure Economy Class
## 515 Boeing 737-800 Business Economy Class
## 516 Unknown Family Leisure Economy Class
## 517 Boeing 747 Family Leisure Economy Class
## 518 Unknown Couple Leisure Economy Class
## 519 Unknown Couple Leisure Economy Class
## 520 Unknown Family Leisure Economy Class
## 521 Unknown Solo Leisure Economy Class
## 522 Boeing 737-800 Family Leisure Economy Class
## 523 Unknown Couple Leisure Economy Class
## 524 Unknown Family Leisure Economy Class
## 525 Unknown Couple Leisure Economy Class
## 526 Boeing 737-800 Business Economy Class
## 527 Unknown Couple Leisure Economy Class
## 528 Unknown Couple Leisure Economy Class
## 529 Unknown Couple Leisure Economy Class
## 530 Unknown Family Leisure Economy Class
## 531 Unknown Couple Leisure Economy Class
## 532 Boeing 737-800 Solo Leisure Economy Class
## 533 Unknown Family Leisure Economy Class
## 534 Unknown Solo Leisure Economy Class
## 535 Boeing 737-800 Family Leisure Economy Class
## 536 Unknown Family Leisure Economy Class
## 537 Unknown Solo Leisure Economy Class
## 538 Unknown Couple Leisure Economy Class
## 539 Unknown Couple Leisure Economy Class
## 540 Unknown Couple Leisure Economy Class
## 541 Unknown Couple Leisure Economy Class
## 542 Boeing 737-800 Family Leisure Economy Class
## 543 Unknown Solo Leisure Economy Class
## 544 Unknown Solo Leisure Economy Class
## 545 Unknown Solo Leisure Economy Class
## 546 Unknown Family Leisure Economy Class
## 547 Unknown Family Leisure Economy Class
## 548 Unknown Couple Leisure Economy Class
## 549 Unknown Solo Leisure Economy Class
## 550 Unknown Family Leisure Economy Class
## 551 Boeing 737-800 Family Leisure Economy Class
## 552 Unknown Solo Leisure Economy Class
## 553 Unknown Solo Leisure Economy Class
## 554 B737 Couple Leisure Economy Class
## 555 Unknown Family Leisure Economy Class
## 556 Unknown Couple Leisure Economy Class
## 557 Unknown Family Leisure Economy Class
## 558 Unknown Family Leisure Economy Class
## 559 Unknown Couple Leisure Economy Class
## 560 Unknown Couple Leisure Economy Class
## 561 Unknown Family Leisure Economy Class
## 562 Unknown Solo Leisure Economy Class
## 563 Unknown Couple Leisure Economy Class
## 564 Unknown Family Leisure Economy Class
## 565 Boeing 737-800 Family Leisure Economy Class
## 566 Unknown Couple Leisure Economy Class
## 567 Unknown Couple Leisure Economy Class
## 568 Unknown Couple Leisure Economy Class
## 569 Unknown Couple Leisure Economy Class
## 570 Unknown Family Leisure Economy Class
## 571 Unknown Family Leisure Economy Class
## 572 Boeing 737 Family Leisure Economy Class
## 573 Unknown Family Leisure Economy Class
## 574 Boeing 737 Family Leisure Economy Class
## 575 Unknown Solo Leisure Economy Class
## 576 Unknown Family Leisure Economy Class
## 577 Unknown Solo Leisure Economy Class
## 578 Boeing 737-800 Family Leisure Economy Class
## 579 Unknown Couple Leisure Economy Class
## 580 Boeing 737 Solo Leisure Economy Class
## 581 Unknown Family Leisure Economy Class
## 582 Unknown Solo Leisure Economy Class
## 583 Boeing 737 Solo Leisure Economy Class
## 584 Boeing 737-8AS Couple Leisure Economy Class
## 585 Unknown Solo Leisure Economy Class
## 586 Boeing 737-800 Couple Leisure Economy Class
## 587 Unknown Couple Leisure Economy Class
## 588 Boeing 737-800 Solo Leisure Economy Class
## 589 Boeing 737-800 Solo Leisure Economy Class
## 590 Boeing 737 Business Economy Class
## 591 Unknown Business Economy Class
## 592 Boeing 737 Solo Leisure Economy Class
## 593 Boeing 737-800 Couple Leisure Economy Class
## 594 Unknown Solo Leisure Economy Class
## 595 Boeing 737-800 Solo Leisure Economy Class
## 596 Unknown Couple Leisure Economy Class
## 597 Unknown Family Leisure Economy Class
## 598 Unknown Solo Leisure Economy Class
## 599 Unknown Couple Leisure Economy Class
## 600 Boeing 737-800 Solo Leisure Economy Class
## 601 Unknown Family Leisure Economy Class
## 602 Unknown Solo Leisure Economy Class
## 603 Unknown Family Leisure Economy Class
## 604 Unknown Family Leisure Economy Class
## 605 Unknown Couple Leisure Economy Class
## 606 Unknown Business Economy Class
## 607 Unknown Family Leisure Economy Class
## 608 Boeing 737-800 Solo Leisure Economy Class
## 609 Boeing 737-800 Solo Leisure Economy Class
## 610 Unknown Solo Leisure Economy Class
## 611 Unknown Couple Leisure Economy Class
## 612 Unknown Couple Leisure Economy Class
## 613 Unknown Family Leisure Economy Class
## 614 Unknown Family Leisure Economy Class
## 615 Unknown Couple Leisure Economy Class
## 616 Unknown Solo Leisure Economy Class
## 617 Unknown Couple Leisure Economy Class
## 618 Unknown Couple Leisure Economy Class
## 619 Boeing 737 Family Leisure Economy Class
## 620 Unknown Family Leisure Economy Class
## 621 Boeing 737-800 Couple Leisure Economy Class
## 622 Boeing 737-800 Business Economy Class
## 623 Boeing 737 Family Leisure Economy Class
## 624 Unknown Family Leisure Economy Class
## 625 Unknown Couple Leisure Economy Class
## 626 Unknown Couple Leisure Economy Class
## 627 Unknown Business Economy Class
## 628 Unknown Couple Leisure Economy Class
## 629 Boeing 737 Family Leisure Economy Class
## 630 Boeing 737-800 Solo Leisure Economy Class
## 631 Unknown Solo Leisure Economy Class
## 632 Boeing 737-800 Solo Leisure Economy Class
## 633 Unknown Solo Leisure Economy Class
## 634 Unknown Solo Leisure Economy Class
## 635 Unknown Family Leisure Economy Class
## 636 Unknown Family Leisure Economy Class
## 637 Boeing 737 Solo Leisure Economy Class
## 638 Unknown Couple Leisure Economy Class
## 639 Unknown Business Economy Class
## 640 Unknown Couple Leisure Economy Class
## 641 Boeing 737 Solo Leisure Economy Class
## 642 Unknown Family Leisure Economy Class
## 643 Unknown Family Leisure Economy Class
## 644 Unknown Solo Leisure Economy Class
## 645 Unknown Solo Leisure Economy Class
## 646 Unknown Family Leisure Economy Class
## 647 Unknown Couple Leisure Economy Class
## 648 Unknown Couple Leisure Economy Class
## 649 Unknown Business Economy Class
## 650 Unknown Family Leisure Economy Class
## 651 Unknown Business Economy Class
## 652 Unknown Business Economy Class
## 653 Unknown Couple Leisure Economy Class
## 654 Boeing 737-800 Solo Leisure Economy Class
## 655 Boeing 737-800 Solo Leisure Economy Class
## 656 Unknown Solo Leisure Economy Class
## 657 Unknown Family Leisure Economy Class
## 658 Boeing 737-800 Family Leisure Economy Class
## 659 Unknown Couple Leisure Economy Class
## 660 Boeing 737 Solo Leisure Economy Class
## 661 Unknown Family Leisure Economy Class
## 662 Unknown Couple Leisure Economy Class
## 663 Unknown Couple Leisure Economy Class
## 664 Unknown Family Leisure Economy Class
## 665 Unknown Family Leisure Economy Class
## 666 Unknown Solo Leisure Economy Class
## 667 FR8852 Solo Leisure Economy Class
## 668 Unknown Solo Leisure Economy Class
## 669 Unknown Solo Leisure Economy Class
## 670 Boeing 737 Couple Leisure Premium Economy
## 671 Boeing 737-800 Solo Leisure Economy Class
## 672 Unknown Solo Leisure Economy Class
## 673 Unknown Couple Leisure Economy Class
## 674 Unknown Business Economy Class
## 675 Boeing 737 Family Leisure Economy Class
## 676 Boeing 737-400 Family Leisure Economy Class
## 677 Boeing 737 Couple Leisure Economy Class
## 678 A320 Family Leisure Economy Class
## 679 Unknown Family Leisure Premium Economy
## 680 Unknown Business Economy Class
## 681 Unknown Family Leisure Economy Class
## 682 Unknown Couple Leisure Economy Class
## 683 Boeing 737 Business Economy Class
## 684 Boeing 738 Solo Leisure Economy Class
## 685 Unknown Couple Leisure Economy Class
## 686 Unknown Couple Leisure Economy Class
## 687 Unknown Couple Leisure Economy Class
## 688 Unknown Family Leisure Economy Class
## 689 Boeing 747 Couple Leisure Economy Class
## 690 Unknown Solo Leisure Economy Class
## 691 Boeing 737 Solo Leisure Economy Class
## 692 Boeing 737-800 Family Leisure Economy Class
## 693 Unknown Couple Leisure Economy Class
## 694 Unknown Couple Leisure Economy Class
## 695 Unknown Couple Leisure Economy Class
## 696 Unknown Family Leisure Economy Class
## 697 Unknown Couple Leisure Economy Class
## 698 Unknown Family Leisure Economy Class
## 699 Boeing 737-800 Solo Leisure Economy Class
## 700 Unknown Family Leisure Economy Class
## 701 Unknown Couple Leisure Economy Class
## 702 Unknown Couple Leisure Economy Class
## 703 Unknown Couple Leisure Economy Class
## 704 Unknown Couple Leisure Economy Class
## 705 Boeing 737-800 Solo Leisure Economy Class
## 706 Unknown Couple Leisure Economy Class
## 707 Unknown Couple Leisure Economy Class
## 708 Boeing 737-800 Couple Leisure Economy Class
## 709 Unknown Couple Leisure Economy Class
## 710 Unknown Solo Leisure Economy Class
## 711 Boeing 737-800 Couple Leisure Economy Class
## 712 Boeing 737-800 Couple Leisure Economy Class
## 713 Unknown Couple Leisure Economy Class
## 714 Unknown Family Leisure Economy Class
## 715 Unknown Family Leisure Economy Class
## 716 Boeing 737-800 Couple Leisure Economy Class
## 717 Unknown Family Leisure Economy Class
## 718 Boeing 737-800 Family Leisure Economy Class
## 719 Boeing 737-800 Family Leisure Economy Class
## 720 Unknown Solo Leisure Economy Class
## 721 Boeing 737-800 Solo Leisure Economy Class
## 722 Boeing 747 Solo Leisure Economy Class
## 723 Boeing 738 Solo Leisure Economy Class
## 724 Unknown Couple Leisure Economy Class
## 725 Boeing 737 Couple Leisure Economy Class
## 726 Unknown Couple Leisure Economy Class
## 727 Unknown Family Leisure Economy Class
## 728 Boeing 737 Family Leisure Economy Class
## 729 Unknown Solo Leisure Economy Class
## 730 Unknown Couple Leisure Economy Class
## 731 Boeing 737 800 Solo Leisure Economy Class
## 732 Unknown Business Economy Class
## 733 Boeing 737 Couple Leisure Economy Class
## 734 Unknown Couple Leisure Economy Class
## 735 Boeing 737 Solo Leisure Economy Class
## 736 Unknown Family Leisure Economy Class
## 737 Boeing 737-800 Business Economy Class
## 738 Unknown Business Economy Class
## 739 Unknown Couple Leisure Economy Class
## 740 Unknown Couple Leisure Economy Class
## 741 Unknown Solo Leisure Economy Class
## 742 Unknown Couple Leisure Economy Class
## 743 Boeing 737-800 Solo Leisure Economy Class
## 744 Boeing 737 Couple Leisure Economy Class
## 745 Unknown Family Leisure Economy Class
## 746 Unknown Business Economy Class
## 747 Boeing 737 Family Leisure Economy Class
## 748 Unknown Solo Leisure Economy Class
## 749 Boeing 737 800 Solo Leisure Economy Class
## 750 B737 800 Business Economy Class
## 751 Unknown Couple Leisure Economy Class
## 752 Unknown Family Leisure Economy Class
## 753 Unknown Family Leisure Economy Class
## 754 Boeing 737-8 Solo Leisure Economy Class
## 755 Unknown Couple Leisure Economy Class
## 756 Unknown Couple Leisure Economy Class
## 757 Unknown Business Economy Class
## 758 Unknown Couple Leisure Economy Class
## 759 Unknown Couple Leisure Economy Class
## 760 Boeing 737-800 Solo Leisure Economy Class
## 761 Unknown Couple Leisure Economy Class
## 762 Unknown Family Leisure Economy Class
## 763 Unknown Solo Leisure Economy Class
## 764 Unknown Couple Leisure Economy Class
## 765 Unknown Couple Leisure Economy Class
## 766 Unknown Solo Leisure Economy Class
## 767 Boeing 737 800 Solo Leisure Economy Class
## 768 Unknown Solo Leisure Economy Class
## 769 Boeing 737-800 Family Leisure Economy Class
## 770 Unknown Solo Leisure Economy Class
## 771 Unknown Couple Leisure Economy Class
## 772 Unknown Solo Leisure Economy Class
## 773 Unknown Solo Leisure Economy Class
## 774 Unknown Solo Leisure Economy Class
## 775 Unknown Solo Leisure Economy Class
## 776 Unknown Solo Leisure Economy Class
## 777 Unknown Couple Leisure Economy Class
## 778 Unknown Couple Leisure Economy Class
## 779 Unknown Solo Leisure Economy Class
## 780 Unknown Business Economy Class
## 781 Boeing 737 Solo Leisure Economy Class
## 782 Unknown Couple Leisure Economy Class
## 783 Unknown Couple Leisure Economy Class
## 784 Boeing 737-800 Solo Leisure Economy Class
## 785 Unknown Solo Leisure Economy Class
## 786 Unknown Solo Leisure Economy Class
## 787 Unknown Solo Leisure Economy Class
## 788 Unknown Solo Leisure Economy Class
## 789 Unknown Couple Leisure Economy Class
## 790 A340 Couple Leisure Economy Class
## 791 Unknown Solo Leisure Economy Class
## 792 Unknown Couple Leisure Economy Class
## 793 Unknown Couple Leisure Economy Class
## 794 Boeing 737-800 Couple Leisure Economy Class
## 795 Unknown Couple Leisure Economy Class
## 796 Boeing 737 Family Leisure Economy Class
## 797 Boeing 737 Solo Leisure Economy Class
## 798 Boeing 737-700 Solo Leisure Economy Class
## 799 Unknown Couple Leisure Economy Class
## 800 Boeing 737-800 Solo Leisure Economy Class
## 801 Unknown Business Economy Class
## 802 Unknown Couple Leisure Economy Class
## 803 Unknown Business Economy Class
## 804 Unknown Couple Leisure Economy Class
## 805 Unknown Family Leisure Economy Class
## 806 Unknown Family Leisure Economy Class
## 807 Unknown Solo Leisure Economy Class
## 808 Unknown Family Leisure Economy Class
## 809 Unknown Solo Leisure Economy Class
## 810 Unknown Solo Leisure Economy Class
## 811 Unknown Couple Leisure Economy Class
## 812 Unknown Couple Leisure Economy Class
## 813 Boeing 737-800 Solo Leisure Economy Class
## 814 Unknown Family Leisure Economy Class
## 815 Unknown Couple Leisure Economy Class
## 816 Unknown Solo Leisure Economy Class
## 817 Unknown Solo Leisure Economy Class
## 818 Unknown Couple Leisure Economy Class
## 819 Boeing 737-800 Couple Leisure Economy Class
## 820 Unknown Couple Leisure Economy Class
## 821 Unknown Family Leisure Economy Class
## 822 Unknown Solo Leisure Economy Class
## 823 Boeing 737-800 Couple Leisure Economy Class
## 824 Unknown Business Premium Economy
## 825 Unknown Couple Leisure Economy Class
## 826 Unknown Couple Leisure Economy Class
## 827 Unknown Couple Leisure Economy Class
## 828 Boeing 737-800 Solo Leisure Economy Class
## 829 Unknown Solo Leisure Economy Class
## 830 Unknown Business Economy Class
## 831 Boeing 737-800 Solo Leisure Economy Class
## 832 Unknown Solo Leisure Economy Class
## 833 Unknown Family Leisure Economy Class
## 834 Unknown Solo Leisure Economy Class
## 835 Unknown Solo Leisure Economy Class
## 836 Unknown Family Leisure Economy Class
## 837 Unknown Couple Leisure Economy Class
## 838 Boeing 737-8AS Family Leisure Economy Class
## 839 Unknown Family Leisure Economy Class
## 840 Boeing 737 Family Leisure Economy Class
## 841 Unknown Business Economy Class
## 842 Boeing 737-800 Solo Leisure Economy Class
## 843 Boeing 737-800 Solo Leisure Economy Class
## 844 Boeing 737 Solo Leisure Economy Class
## 845 Boeing 737-800 Couple Leisure Economy Class
## 846 Unknown Solo Leisure Economy Class
## 847 Unknown Family Leisure Economy Class
## 848 Unknown Family Leisure Economy Class
## 849 Unknown Solo Leisure Economy Class
## 850 Boeing 737-8AS Solo Leisure Economy Class
## 851 Unknown Couple Leisure Economy Class
## 852 Boeing 737-800 Solo Leisure Economy Class
## 853 Unknown Solo Leisure Economy Class
## 854 Boeing 737-800 Couple Leisure Economy Class
## 855 Unknown Family Leisure Economy Class
## 856 Unknown Couple Leisure Economy Class
## 857 Unknown Family Leisure Economy Class
## 858 Unknown Family Leisure Economy Class
## 859 Unknown Solo Leisure Economy Class
## 860 Unknown Business Economy Class
## 861 Unknown Couple Leisure Economy Class
## 862 Unknown Solo Leisure Economy Class
## 863 Boeing 737 Solo Leisure Economy Class
## 864 Unknown Business Economy Class
## 865 Unknown Couple Leisure Economy Class
## 866 Unknown Solo Leisure Economy Class
## 867 Unknown Family Leisure Economy Class
## 868 Unknown Family Leisure Economy Class
## 869 Unknown Business Economy Class
## 870 Unknown Solo Leisure Economy Class
## 871 Unknown Family Leisure Economy Class
## 872 Unknown Business Economy Class
## 873 Unknown Solo Leisure Economy Class
## 874 Boeing 737 Family Leisure Economy Class
## 875 Unknown Family Leisure Economy Class
## 876 Unknown Solo Leisure Economy Class
## 877 Unknown Family Leisure Economy Class
## 878 Unknown Family Leisure Economy Class
## 879 Unknown Business Economy Class
## 880 Boeing 737-800 Solo Leisure Economy Class
## 881 Unknown Couple Leisure Economy Class
## 882 Boeing 737-800 Couple Leisure Economy Class
## 883 Unknown Solo Leisure Economy Class
## 884 Unknown Couple Leisure Economy Class
## 885 A319 Couple Leisure Economy Class
## 886 Unknown Solo Leisure Economy Class
## 887 Unknown Solo Leisure Economy Class
## 888 Unknown Solo Leisure Economy Class
## 889 Unknown Business Economy Class
## 890 B737-800 Solo Leisure Economy Class
## 891 Unknown Couple Leisure Economy Class
## 892 Unknown Solo Leisure Economy Class
## 893 Unknown Solo Leisure Economy Class
## 894 Unknown Solo Leisure Economy Class
## 895 Unknown Business Economy Class
## 896 Boeing 737 Couple Leisure Economy Class
## 897 Unknown Solo Leisure Economy Class
## 898 Unknown Family Leisure Economy Class
## 899 Unknown Couple Leisure Economy Class
## 900 Unknown Couple Leisure Economy Class
## 901 Unknown Couple Leisure Economy Class
## 902 Boeing 737-800 Solo Leisure Economy Class
## 903 Unknown Solo Leisure Economy Class
## 904 Unknown Couple Leisure Economy Class
## 905 Unknown Solo Leisure Economy Class
## 906 Unknown Family Leisure Economy Class
## 907 Unknown Solo Leisure Economy Class
## 908 Boeing 737-800 Business Economy Class
## 909 Boeing 737-800 Business Economy Class
## 910 Unknown Family Leisure Economy Class
## 911 B737-800 Couple Leisure Economy Class
## 912 Unknown Solo Leisure Economy Class
## 913 Unknown Solo Leisure Economy Class
## 914 Unknown Family Leisure Economy Class
## 915 Boeing 737-800 Solo Leisure Economy Class
## 916 Boeing 737-800 Solo Leisure Economy Class
## 917 Unknown Solo Leisure Economy Class
## 918 Unknown Solo Leisure Economy Class
## 919 Boeing 737 Couple Leisure Economy Class
## 920 Unknown Couple Leisure Economy Class
## 921 Boeing 737-800 Family Leisure Economy Class
## 922 Unknown Couple Leisure Economy Class
## 923 Unknown Couple Leisure Economy Class
## 924 Unknown Solo Leisure Economy Class
## 925 Unknown Couple Leisure Economy Class
## 926 Unknown Couple Leisure Economy Class
## 927 Unknown Couple Leisure Economy Class
## 928 Unknown Family Leisure Economy Class
## 929 Unknown Couple Leisure Economy Class
## 930 Unknown Couple Leisure Economy Class
## 931 Unknown Couple Leisure Economy Class
## 932 Unknown Couple Leisure Economy Class
## 933 Unknown Solo Leisure Economy Class
## 934 Boeing 737-800 Couple Leisure Economy Class
## 935 Unknown Couple Leisure Economy Class
## 936 Unknown Solo Leisure Economy Class
## 937 Unknown Solo Leisure Economy Class
## 938 Unknown Couple Leisure Economy Class
## 939 Unknown Couple Leisure Economy Class
## 940 Boeing 737-800 Solo Leisure Economy Class
## 941 Unknown Solo Leisure Economy Class
## 942 Unknown Solo Leisure Economy Class
## 943 Boeing 737-800 Business Economy Class
## 944 Boeing 737 Business Economy Class
## 945 Unknown Couple Leisure Economy Class
## 946 Boeing 737-800 Solo Leisure Economy Class
## 947 B737 Business Economy Class
## 948 Unknown Family Leisure Economy Class
## 949 Boeing 737-800 Business Economy Class
## 950 Boeing 737-800 Business Economy Class
## 951 Unknown Solo Leisure Economy Class
## 952 Unknown Business Economy Class
## 953 Unknown Solo Leisure Economy Class
## 954 Unknown Solo Leisure Economy Class
## 955 Unknown Family Leisure Economy Class
## 956 Unknown Solo Leisure Economy Class
## 957 Unknown Family Leisure Economy Class
## 958 Unknown Couple Leisure Economy Class
## 959 B737-800 Solo Leisure Economy Class
## 960 B737-800 Solo Leisure Economy Class
## 961 Unknown Couple Leisure Economy Class
## 962 Boeing 737 Solo Leisure Economy Class
## 963 Boeing 737 Family Leisure Economy Class
## 964 Unknown Solo Leisure Economy Class
## 965 Unknown Family Leisure Economy Class
## 966 Boeing 737-800 Couple Leisure Economy Class
## 967 Unknown Solo Leisure Economy Class
## 968 Boeing 737 Couple Leisure Economy Class
## 969 Unknown Family Leisure Economy Class
## 970 Unknown Family Leisure Economy Class
## 971 Boeing 737 Solo Leisure Economy Class
## 972 Unknown Solo Leisure Economy Class
## 973 Unknown Couple Leisure Economy Class
## 974 Boeing 737 Solo Leisure Economy Class
## 975 Boeing 737 Solo Leisure Economy Class
## 976 Unknown Couple Leisure Economy Class
## 977 Unknown Solo Leisure Economy Class
## 978 Unknown Solo Leisure Economy Class
## 979 Unknown Solo Leisure Economy Class
## 980 Unknown Couple Leisure Economy Class
## 981 Unknown Family Leisure Economy Class
## 982 Unknown Solo Leisure Economy Class
## 983 Unknown Solo Leisure Economy Class
## 984 Unknown Solo Leisure Economy Class
## 985 Unknown Couple Leisure Economy Class
## 986 Unknown Solo Leisure Economy Class
## 987 Boeing 737-800 Business Economy Class
## 988 Boeing 737-800 Business Economy Class
## 989 Unknown Couple Leisure Economy Class
## 990 Boeing 737-800 Couple Leisure Economy Class
## 991 Unknown Couple Leisure Economy Class
## 992 Boeing 737 Solo Leisure Economy Class
## 993 Unknown Family Leisure Economy Class
## 994 Boeing 737-800 Solo Leisure Economy Class
## 995 Unknown Family Leisure Economy Class
## 996 Unknown Family Leisure Economy Class
## 997 Unknown Family Leisure Economy Class
## 998 Unknown Solo Leisure Economy Class
## 999 Boeing 737-800 Family Leisure Economy Class
## 1000 Boeing 737-800 Business Economy Class
## 1001 Boeing 737-800 Family Leisure Economy Class
## 1002 Unknown Couple Leisure Economy Class
## 1003 Unknown Couple Leisure Economy Class
## 1004 Unknown Couple Leisure Economy Class
## 1005 Boeing 737-800 Business Economy Class
## 1006 Boeing 737-800 Business Economy Class
## 1007 Boeing 737 Couple Leisure Economy Class
## 1008 Unknown Solo Leisure Economy Class
## 1009 Boeing 737-800 Couple Leisure Economy Class
## 1010 Boeing 747-400 Solo Leisure Economy Class
## 1011 Unknown Solo Leisure Economy Class
## 1012 Boeing 737-800 Couple Leisure Economy Class
## 1013 Boeing 737-800 Business Economy Class
## 1014 Unknown Couple Leisure Economy Class
## 1015 Boeing 737 Couple Leisure Economy Class
## 1016 Boeing 737- 800 Couple Leisure Economy Class
## 1017 Unknown Couple Leisure Economy Class
## 1018 Unknown Solo Leisure Economy Class
## 1019 Boeing 737-800 Solo Leisure Economy Class
## 1020 Unknown Couple Leisure Economy Class
## 1021 Unknown Couple Leisure Economy Class
## 1022 Unknown Family Leisure Economy Class
## 1023 Unknown Couple Leisure Economy Class
## 1024 Unknown Couple Leisure Economy Class
## 1025 Unknown Solo Leisure Economy Class
## 1026 Unknown Solo Leisure Economy Class
## 1027 Unknown Family Leisure Economy Class
## 1028 Unknown Couple Leisure Economy Class
## 1029 Boeing 737-800 Business Economy Class
## 1030 Boeing 737-800 Family Leisure Economy Class
## 1031 Unknown Family Leisure Economy Class
## 1032 Unknown Business Economy Class
## 1033 Unknown Couple Leisure Economy Class
## 1034 Unknown Couple Leisure Economy Class
## 1035 Boeing 737-800 Couple Leisure Economy Class
## 1036 Boeing 737 - 800 Solo Leisure Economy Class
## 1037 Boeing 737-800 Couple Leisure Economy Class
## 1038 Boeing 737 Solo Leisure Economy Class
## 1039 Unknown Solo Leisure Economy Class
## 1040 Boeing 737 Family Leisure Economy Class
## 1041 Unknown Family Leisure Economy Class
## 1042 Unknown Couple Leisure Economy Class
## 1043 Unknown Family Leisure Economy Class
## 1044 Boeing 737-800 Couple Leisure Economy Class
## 1045 Boeing 737-800 Solo Leisure Economy Class
## 1046 Unknown Business Economy Class
## 1047 Unknown Family Leisure Economy Class
## 1048 Unknown Couple Leisure Economy Class
## 1049 Unknown Couple Leisure Economy Class
## 1050 Unknown Family Leisure Economy Class
## 1051 Unknown Couple Leisure Economy Class
## 1052 Boeing 737 Couple Leisure Economy Class
## 1053 Boeing 737-800 Solo Leisure Economy Class
## 1054 Unknown Solo Leisure Economy Class
## 1055 Unknown Solo Leisure Economy Class
## 1056 Unknown Couple Leisure Economy Class
## 1057 A340 Couple Leisure Economy Class
## 1058 Boeing 737 Couple Leisure Economy Class
## 1059 Unknown Couple Leisure Economy Class
## 1060 Unknown Solo Leisure Economy Class
## 1061 Boeing 737-800 Solo Leisure Economy Class
## 1062 Unknown Solo Leisure Economy Class
## 1063 Unknown Couple Leisure Economy Class
## 1064 Boeing 737 Solo Leisure Economy Class
## 1065 Unknown Solo Leisure Economy Class
## 1066 Unknown Solo Leisure Economy Class
## 1067 Unknown Couple Leisure Economy Class
## 1068 Unknown Couple Leisure Economy Class
## 1069 Unknown Solo Leisure Economy Class
## 1070 Unknown Solo Leisure Economy Class
## 1071 Unknown Couple Leisure Economy Class
## 1072 Unknown Solo Leisure Economy Class
## 1073 Unknown Solo Leisure Economy Class
## 1074 Unknown Solo Leisure Economy Class
## 1075 Unknown Couple Leisure Economy Class
## 1076 Unknown Solo Leisure Economy Class
## 1077 Boeing 737-800 Business Economy Class
## 1078 Boeing 737-800 Couple Leisure Economy Class
## 1079 Unknown Solo Leisure Economy Class
## 1080 Boeing 737-800 Couple Leisure Economy Class
## 1081 Boeing 737 Couple Leisure Economy Class
## 1082 Boing 737-800 Solo Leisure Economy Class
## 1083 Unknown Family Leisure Economy Class
## 1084 Unknown Solo Leisure Economy Class
## 1085 Unknown Business Economy Class
## 1086 Unknown Couple Leisure Economy Class
## 1087 Unknown Couple Leisure Economy Class
## 1088 Unknown Couple Leisure Economy Class
## 1089 Unknown Family Leisure Economy Class
## 1090 Unknown Solo Leisure Economy Class
## 1091 Boeing 737 Couple Leisure Economy Class
## 1092 Boeing 737-800 Couple Leisure Economy Class
## 1093 Unknown Couple Leisure Economy Class
## 1094 Boeing 737-800 Couple Leisure Economy Class
## 1095 Unknown Family Leisure Economy Class
## 1096 Unknown Couple Leisure Economy Class
## 1097 Unknown Solo Leisure Economy Class
## 1098 Unknown Couple Leisure Economy Class
## 1099 Unknown Couple Leisure Economy Class
## 1100 Boeing 737-800 Couple Leisure Economy Class
## 1101 Unknown Solo Leisure Economy Class
## 1102 Unknown Family Leisure Economy Class
## 1103 Unknown Couple Leisure Economy Class
## 1104 Unknown Family Leisure Economy Class
## 1105 Boeing 737-800 Solo Leisure Economy Class
## 1106 Boeing 737-800 Solo Leisure Economy Class
## 1107 Unknown Solo Leisure Economy Class
## 1108 Unknown Couple Leisure Economy Class
## 1109 Unknown Couple Leisure Economy Class
## 1110 Unknown Couple Leisure Economy Class
## 1111 Unknown Business Economy Class
## 1112 Boeing 737-800 Family Leisure Economy Class
## 1113 Boeing 737-800 Family Leisure Economy Class
## 1114 Unknown Family Leisure Economy Class
## 1115 Unknown Family Leisure Economy Class
## 1116 Boeing 738 Solo Leisure Economy Class
## 1117 Boeing 737 Solo Leisure Economy Class
## 1118 Boeing 737-800 Couple Leisure Economy Class
## 1119 Unknown Family Leisure Economy Class
## 1120 Boeing 737 Family Leisure Economy Class
## 1121 Unknown Family Leisure Economy Class
## 1122 Unknown Solo Leisure Economy Class
## 1123 Unknown Couple Leisure Economy Class
## 1124 Unknown Solo Leisure Economy Class
## 1125 Unknown Family Leisure Economy Class
## 1126 Unknown Solo Leisure Economy Class
## 1127 Unknown Family Leisure Economy Class
## 1128 Unknown Couple Leisure Economy Class
## 1129 Unknown Solo Leisure Economy Class
## 1130 Unknown Couple Leisure Economy Class
## 1131 Unknown Family Leisure Economy Class
## 1132 Unknown Couple Leisure Economy Class
## 1133 Unknown Couple Leisure Economy Class
## 1134 Boeing 737-800 Family Leisure Economy Class
## 1135 Boeing 738 Family Leisure Economy Class
## 1136 Unknown Couple Leisure Economy Class
## 1137 Boeing 737 Couple Leisure Economy Class
## 1138 Unknown Solo Leisure Economy Class
## 1139 Unknown Couple Leisure Economy Class
## 1140 Unknown Solo Leisure Economy Class
## 1141 Boeing 738 Business Economy Class
## 1142 Unknown Couple Leisure Economy Class
## 1143 Unknown Family Leisure Economy Class
## 1144 Unknown Family Leisure Economy Class
## 1145 Boeing 737-800 Couple Leisure Economy Class
## 1146 Unknown Family Leisure Economy Class
## 1147 Unknown Solo Leisure Economy Class
## 1148 Unknown Couple Leisure Economy Class
## 1149 Unknown Family Leisure Economy Class
## 1150 Unknown Couple Leisure Economy Class
## 1151 Unknown Couple Leisure Economy Class
## 1152 Boeing 737 Couple Leisure Economy Class
## 1153 Boeing 737-800 Couple Leisure Economy Class
## 1154 Unknown Couple Leisure Economy Class
## 1155 Unknown Couple Leisure Economy Class
## 1156 Boeing 737-800 Couple Leisure Economy Class
## 1157 Unknown Couple Leisure Economy Class
## 1158 Unknown Family Leisure Economy Class
## 1159 Unknown Couple Leisure Economy Class
## 1160 Boeing 737-800 Family Leisure Economy Class
## 1161 Boeing 737 Couple Leisure Economy Class
## 1162 Unknown Couple Leisure Economy Class
## 1163 Unknown Family Leisure Economy Class
## 1164 Unknown Solo Leisure Economy Class
## 1165 Boeing 737-800 Couple Leisure Economy Class
## 1166 Boeing 737-800 Couple Leisure Economy Class
## 1167 Boeing Couple Leisure Economy Class
## 1168 Unknown Business Economy Class
## 1169 Unknown Solo Leisure Economy Class
## 1170 Unknown Couple Leisure Economy Class
## 1171 Unknown Solo Leisure Economy Class
## 1172 Unknown Solo Leisure Economy Class
## 1173 Unknown Solo Leisure Premium Economy
## 1174 Boeing 737-800 Solo Leisure Economy Class
## 1175 Boeing 737-800 Business Economy Class
## 1176 Boeing 737 Solo Leisure Economy Class
## 1177 Unknown Couple Leisure Economy Class
## 1178 Boeing 737-800 Solo Leisure Economy Class
## 1179 Boeing 737-800 Couple Leisure Economy Class
## 1180 Boeing 737-800 Business Economy Class
## 1181 Boeing 737-800 Business Economy Class
## 1182 Unknown Couple Leisure Economy Class
## 1183 Boeing 737 Couple Leisure Economy Class
## 1184 Boeing 737-800 Solo Leisure Economy Class
## 1185 B737-800 Couple Leisure Economy Class
## 1186 Boeing 737-800 Couple Leisure Economy Class
## 1187 Unknown Solo Leisure Economy Class
## 1188 Boeing 737-800 Solo Leisure Economy Class
## 1189 Boeing 737-800 Solo Leisure Economy Class
## 1190 Boeing 737-800 Couple Leisure Economy Class
## 1191 Boeing 737-800 Couple Leisure Economy Class
## 1192 Unknown Couple Leisure Economy Class
## 1193 Boeing 737-800 Solo Leisure Economy Class
## 1194 Unknown Solo Leisure Economy Class
## 1195 Boeing 737-800 Solo Leisure Economy Class
## 1196 Unknown Solo Leisure Economy Class
## 1197 Boeing 737-800 Couple Leisure Economy Class
## 1198 Unknown Solo Leisure Economy Class
## 1199 Unknown Couple Leisure Economy Class
## 1200 Boeing 737-800 Couple Leisure Economy Class
## 1201 Boeing 737-800 Couple Leisure Economy Class
## 1202 Boeing 737-800 Family Leisure Economy Class
## 1203 Unknown Solo Leisure Economy Class
## 1204 Boeing 737-800 Business Economy Class
## 1205 Unknown Couple Leisure Economy Class
## 1206 Boeing 737 Business Economy Class
## 1207 Unknown Couple Leisure Economy Class
## 1208 Boeing 737-800 Solo Leisure Economy Class
## 1209 Boeing 737 Business Economy Class
## 1210 Boeing 737-800 Couple Leisure Economy Class
## 1211 Boeing 737 Solo Leisure Economy Class
## 1212 Boeing 737-800 Solo Leisure Economy Class
## 1213 Unknown Solo Leisure Economy Class
## 1214 Boeing 737-800 Solo Leisure Economy Class
## 1215 Unknown Solo Leisure Economy Class
## 1216 Unknown Solo Leisure Economy Class
## 1217 Boeing 737-800 Solo Leisure Economy Class
## 1218 Boeing 737-800 Solo Leisure Economy Class
## 1219 Boeing 737-800 Couple Leisure Economy Class
## 1220 Boeing 737-800 Solo Leisure Economy Class
## 1221 Boeing 737-800 Solo Leisure Economy Class
## 1222 Unknown Couple Leisure Economy Class
## 1223 Boeing 737-800 Couple Leisure Economy Class
## 1224 Unknown Couple Leisure Economy Class
## 1225 Boeing 737-800 Solo Leisure Economy Class
## 1226 Boeing 737-800 Solo Leisure Economy Class
## 1227 Boeing 737-800 Solo Leisure Economy Class
## 1228 Boeing 737-800 Family Leisure Economy Class
## 1229 Unknown Solo Leisure Economy Class
## 1230 Boeing 737-800 Couple Leisure Economy Class
## 1231 Boeing 737-800 Couple Leisure Economy Class
## 1232 Boeing 737-800 Family Leisure Economy Class
## 1233 Unknown Solo Leisure Economy Class
## 1234 Boeing 747-800 Family Leisure Economy Class
## 1235 Unknown Business Economy Class
## 1236 Unknown Business Economy Class
## 1237 Unknown Family Leisure Economy Class
## 1238 Boeing 737-800 Couple Leisure Economy Class
## 1239 Unknown Couple Leisure Economy Class
## 1240 Boeing 737-800 Couple Leisure Economy Class
## 1241 Boeing 737-900 Business Economy Class
## 1242 Boeing 737-800 Family Leisure Economy Class
## 1243 Unknown Couple Leisure Economy Class
## 1244 Unknown Couple Leisure Economy Class
## 1245 Boeing 737 Solo Leisure Economy Class
## 1246 Boeing 737-800 Couple Leisure Economy Class
## 1247 Unknown Couple Leisure Economy Class
## 1248 Unknown Couple Leisure Economy Class
## 1249 Boeing 737-800 Business Business Class
## 1250 Unknown Couple Leisure Economy Class
## 1251 Boeing 737-800 Couple Leisure Economy Class
## 1252 Boeing 737-800 Couple Leisure Economy Class
## 1253 Boeing 737-800 Family Leisure Economy Class
## 1254 Boeing 737-800 Solo Leisure Economy Class
## 1255 Unknown Couple Leisure Economy Class
## 1256 Boeing 737 Solo Leisure Economy Class
## 1257 Unknown Business Economy Class
## 1258 Boeing 737 Solo Leisure Economy Class
## 1259 Unknown Solo Leisure Economy Class
## 1260 Boeing 737-800 Couple Leisure Economy Class
## 1261 Unknown Solo Leisure Economy Class
## 1262 Boeing 737-800 Family Leisure Economy Class
## 1263 Boeing 737 Couple Leisure Economy Class
## 1264 Unknown Couple Leisure Economy Class
## 1265 Unknown Couple Leisure Economy Class
## 1266 Unknown Couple Leisure Economy Class
## 1267 Unknown Family Leisure Economy Class
## 1268 Boeing 737 Family Leisure Economy Class
## 1269 Unknown Family Leisure Economy Class
## 1270 Unknown Couple Leisure Economy Class
## 1271 Unknown Family Leisure Economy Class
## 1272 Unknown Couple Leisure Economy Class
## 1273 Unknown Family Leisure Economy Class
## 1274 B737-800 Family Leisure Economy Class
## 1275 Boeing 737-800 Couple Leisure Economy Class
## 1276 Boeing 737-800 Family Leisure Economy Class
## 1277 Unknown Family Leisure Economy Class
## 1278 Boeing 737-800 Family Leisure Economy Class
## 1279 Boeing 737-800 Solo Leisure Economy Class
## 1280 Boeing 737-800 Family Leisure Economy Class
## 1281 Unknown Family Leisure Economy Class
## 1282 Unknown Solo Leisure Economy Class
## 1283 Unknown Couple Leisure Economy Class
## 1284 Unknown Business Economy Class
## 1285 Unknown Couple Leisure Economy Class
## 1286 Boeing 738 Family Leisure Economy Class
## 1287 Unknown Family Leisure Economy Class
## 1288 Boeing 737-800 Solo Leisure Economy Class
## 1289 Boeing 737-800 Family Leisure Economy Class
## 1290 Unknown Couple Leisure Economy Class
## 1291 Unknown Solo Leisure Economy Class
## 1292 Unknown Solo Leisure Premium Economy
## 1293 Unknown Couple Leisure Economy Class
## 1294 Unknown Couple Leisure Economy Class
## 1295 Unknown Family Leisure Economy Class
## 1296 n/a Family Leisure Economy Class
## 1297 Unknown Solo Leisure Economy Class
## 1298 Boeing 737-800 Couple Leisure Economy Class
## 1299 Boeing 737-800 Family Leisure Economy Class
## 1300 Unknown Couple Leisure Economy Class
## 1301 Boeing 737-800 Solo Leisure Economy Class
## 1302 Boeing 737-800 Solo Leisure Economy Class
## 1303 Boeing 737-800 Solo Leisure Economy Class
## 1304 Unknown Couple Leisure Economy Class
## 1305 Boeing 737-800 Couple Leisure Economy Class
## 1306 Boeing 737-800 EI-ENX Family Leisure Economy Class
## 1307 Unknown Business Premium Economy
## 1308 Boeing 737 800 Couple Leisure Economy Class
## 1309 Boeing 737-800 Couple Leisure Economy Class
## 1310 Unknown Solo Leisure Economy Class
## 1311 Boeing 737 / 800 Solo Leisure Economy Class
## 1312 Boeing 737-800 Couple Leisure Economy Class
## 1313 Boeing 737-800 Solo Leisure Economy Class
## 1314 Boeing 737-800 Solo Leisure Economy Class
## 1315 Unknown Solo Leisure Economy Class
## 1316 Boeing 737-800 Family Leisure Economy Class
## 1317 Boeing 737-800 Solo Leisure Economy Class
## 1318 Boeing 737-800 Solo Leisure Economy Class
## 1319 Unknown Solo Leisure Economy Class
## 1320 Boeing 737-800 Solo Leisure Economy Class
## 1321 Boeing 737-800 Solo Leisure Economy Class
## 1322 Unknown Couple Leisure Economy Class
## 1323 Unknown Couple Leisure Economy Class
## 1324 Boeing 737 Family Leisure Economy Class
## 1325 Boeing 737-800 Family Leisure Economy Class
## 1326 Boeing 737-800 Solo Leisure Economy Class
## 1327 Unknown Solo Leisure Economy Class
## 1328 Boeing 737-800 Business Economy Class
## 1329 Unknown Couple Leisure Economy Class
## 1330 Boeing 737-800 Solo Leisure Economy Class
## 1331 Unknown Solo Leisure Economy Class
## 1332 Boeing 737-800 Couple Leisure Economy Class
## 1333 Boeing 737-800 Solo Leisure Economy Class
## 1334 Boeing 737 Couple Leisure Economy Class
## 1335 Unknown Solo Leisure Economy Class
## 1336 Boeing 737-800 Solo Leisure Economy Class
## 1337 Boeing 737 Business Economy Class
## 1338 Boeing 737 Solo Leisure Economy Class
## 1339 Unknown Couple Leisure Economy Class
## 1340 Boeing 737-800 Couple Leisure Economy Class
## 1341 B747 Family Leisure Economy Class
## 1342 Unknown Solo Leisure Economy Class
## 1343 Boeing 737-800 Couple Leisure Economy Class
## 1344 Unknown Couple Leisure Economy Class
## 1345 Boeing 737-800 Couple Leisure Economy Class
## 1346 Boeing 737-800 Couple Leisure Economy Class
## 1347 Unknown Family Leisure Economy Class
## 1348 Unknown Solo Leisure Economy Class
## 1349 Boeing 737 Solo Leisure Economy Class
## 1350 Unknown Couple Leisure Economy Class
## 1351 Unknown Couple Leisure Economy Class
## 1352 Boeing 737-800 Couple Leisure Economy Class
## 1353 Boeing 737-800 Couple Leisure Economy Class
## 1354 Unknown Couple Leisure Economy Class
## 1355 Unknown Family Leisure Economy Class
## 1356 Boeing 737-800 Couple Leisure Economy Class
## 1357 Boeing 737-800 Business Economy Class
## 1358 Unknown Couple Leisure Economy Class
## 1359 Boeing 747 Solo Leisure Economy Class
## 1360 Boeing 737-800 Family Leisure Economy Class
## 1361 Unknown Family Leisure Economy Class
## 1362 Unknown Solo Leisure Economy Class
## 1363 Unknown Couple Leisure Economy Class
## 1364 Unknown Solo Leisure Economy Class
## 1365 Unknown Solo Leisure Economy Class
## 1366 Boeing 737-800 Solo Leisure Economy Class
## 1367 Unknown Family Leisure Economy Class
## 1368 Unknown Solo Leisure Economy Class
## 1369 Unknown Couple Leisure Economy Class
## 1370 Boeing 737 Couple Leisure Economy Class
## 1371 Unknown Family Leisure Economy Class
## 1372 Unknown Couple Leisure Economy Class
## 1373 Boeing 737-800 Business Economy Class
## 1374 Unknown Couple Leisure Economy Class
## 1375 Boeing 737 Solo Leisure Economy Class
## 1376 Boeing 737 Family Leisure Economy Class
## 1377 Unknown Family Leisure Economy Class
## 1378 Boeing 737-800 Business Economy Class
## 1379 Boeing 737-800 Couple Leisure Economy Class
## 1380 Unknown Solo Leisure Economy Class
## 1381 Boeing 737-800 Family Leisure Economy Class
## 1382 Unknown Family Leisure Economy Class
## 1383 Unknown Couple Leisure Economy Class
## 1384 Boeing 737-800 Solo Leisure Economy Class
## 1385 Boeing 737-800 Couple Leisure Economy Class
## 1386 Unknown Couple Leisure Premium Economy
## 1387 Boeing 737-800 Family Leisure Economy Class
## 1388 Unknown Solo Leisure Economy Class
## 1389 Boeing 737-800 Couple Leisure Economy Class
## 1390 Unknown Solo Leisure Economy Class
## 1391 Unknown Solo Leisure Economy Class
## 1392 Unknown Solo Leisure Economy Class
## 1393 Unknown Couple Leisure Economy Class
## 1394 Unknown Solo Leisure Economy Class
## 1395 Unknown Solo Leisure Economy Class
## 1396 Boeing 737-800 Family Leisure Economy Class
## 1397 Unknown Solo Leisure Economy Class
## 1398 Unknown Solo Leisure Economy Class
## 1399 Unknown Solo Leisure Economy Class
## 1400 Boeing 737-800 Couple Leisure Economy Class
## 1401 Boeing 737-800 Solo Leisure Economy Class
## 1402 Boeing 737-800 series Couple Leisure Economy Class
## 1403 Boeing 737-800 Couple Leisure First Class
## 1404 Unknown Couple Leisure Economy Class
## 1405 Boeing 737-800 Solo Leisure Economy Class
## 1406 Boeing 737-800 Couple Leisure Economy Class
## 1407 Unknown Family Leisure Economy Class
## 1408 Unknown Couple Leisure Economy Class
## 1409 Boeing 737 Couple Leisure Economy Class
## 1410 Unknown Solo Leisure Economy Class
## 1411 Boeing 737-800 Solo Leisure Economy Class
## 1412 Unknown Couple Leisure Economy Class
## 1413 Boeing 737 Solo Leisure Economy Class
## 1414 A320 Family Leisure Economy Class
## 1415 Unknown Solo Leisure Economy Class
## 1416 Boeing 737 Couple Leisure Economy Class
## 1417 Boeing 737-800 Couple Leisure Economy Class
## 1418 Boeing 737-800 Family Leisure Economy Class
## 1419 Boeing 737-800 Family Leisure Economy Class
## 1420 Unknown Couple Leisure Economy Class
## 1421 Boeing 737-800 Business Economy Class
## 1422 Boeing 737-800 Family Leisure Economy Class
## 1423 Unknown Family Leisure Economy Class
## 1424 Boeing 737 Solo Leisure Economy Class
## 1425 Boeing 737-800 Family Leisure Economy Class
## 1426 Boeing 737-800 Family Leisure Business Class
## 1427 Unknown Family Leisure Economy Class
## 1428 Boeing 737-800 Couple Leisure Economy Class
## 1429 Unknown Family Leisure Economy Class
## 1430 Unknown Solo Leisure Economy Class
## 1431 Unknown Business Economy Class
## 1432 Unknown Family Leisure Economy Class
## 1433 Boeing 737-800 Couple Leisure Economy Class
## 1434 Unknown Solo Leisure Economy Class
## 1435 737300 Couple Leisure Economy Class
## 1436 Boeing 737 800 Couple Leisure Economy Class
## 1437 Unknown Solo Leisure Economy Class
## 1438 Boeing 737-800 Couple Leisure Economy Class
## 1439 Unknown Solo Leisure Economy Class
## 1440 Unknown Couple Leisure Economy Class
## 1441 Unknown Family Leisure Economy Class
## 1442 Boeing 737-800 Solo Leisure Economy Class
## 1443 Unknown Couple Leisure Economy Class
## 1444 Unknown Couple Leisure Economy Class
## 1445 Unknown Couple Leisure Economy Class
## 1446 Boeing 737 Solo Leisure Economy Class
## 1447 Boeing 737-800 Solo Leisure Economy Class
## 1448 Boeing 737-800 Couple Leisure Economy Class
## 1449 Unknown Family Leisure Economy Class
## 1450 Boeing 737 Solo Leisure Economy Class
## 1451 Boeing 737 Couple Leisure Economy Class
## 1452 Unknown Family Leisure Economy Class
## 1453 Unknown Couple Leisure Economy Class
## 1454 Unknown Couple Leisure Economy Class
## 1455 Unknown Solo Leisure Economy Class
## 1456 Unknown Solo Leisure Economy Class
## 1457 Unknown Solo Leisure Economy Class
## 1458 Unknown Couple Leisure Economy Class
## 1459 Unknown Couple Leisure Economy Class
## 1460 Boeing 737-800 Couple Leisure Economy Class
## 1461 Boeing 737 Solo Leisure Economy Class
## 1462 Boeing 737-800 Couple Leisure Economy Class
## 1463 Unknown Solo Leisure Economy Class
## 1464 Boeing 737-800 Couple Leisure Economy Class
## 1465 Unknown Couple Leisure Economy Class
## 1466 Unknown Family Leisure Economy Class
## 1467 Unknown Couple Leisure Economy Class
## 1468 Boeing 737-800 Couple Leisure Economy Class
## 1469 Boeing 737 Solo Leisure Economy Class
## 1470 Unknown Business Economy Class
## 1471 Boeing 737-800 Couple Leisure Economy Class
## 1472 Unknown Solo Leisure Economy Class
## 1473 Unknown Solo Leisure Economy Class
## 1474 Unknown Couple Leisure Economy Class
## 1475 Unknown Solo Leisure Economy Class
## 1476 Unknown Couple Leisure Economy Class
## 1477 Boeing 737 Couple Leisure Economy Class
## 1478 Boeing 737-300 Couple Leisure Economy Class
## 1479 Boeing 737-800 Solo Leisure Economy Class
## 1480 Boeing 737 Solo Leisure Economy Class
## 1481 Unknown Couple Leisure Economy Class
## 1482 Boeing 737-800 Business Economy Class
## 1483 Boeing 737-800 Couple Leisure Economy Class
## 1484 Boeing 737-800 Family Leisure Economy Class
## 1485 Unknown Couple Leisure Economy Class
## 1486 Unknown Business Economy Class
## 1487 Boeing 737-800 Family Leisure Economy Class
## 1488 Boeing 737-800 Couple Leisure Economy Class
## 1489 Unknown Business Economy Class
## 1490 Boeing 737-800 Business Economy Class
## 1491 Unknown Family Leisure Economy Class
## 1492 Unknown Couple Leisure Economy Class
## 1493 Unknown Solo Leisure Economy Class
## 1494 Unknown Couple Leisure Economy Class
## 1495 Unknown Business Economy Class
## 1496 Unknown Couple Leisure Economy Class
## 1497 Unknown Family Leisure Economy Class
## 1498 Unknown Family Leisure Economy Class
## 1499 Unknown Family Leisure Economy Class
## 1500 Unknown Family Leisure Economy Class
## 1501 Unknown Couple Leisure Economy Class
## 1502 Boeing 737-800 Family Leisure Economy Class
## 1503 Unknown Family Leisure Economy Class
## 1504 Boeing 737 Couple Leisure Economy Class
## 1505 Boeing 737-800 Family Leisure Economy Class
## 1506 Unknown Family Leisure Economy Class
## 1507 Unknown Family Leisure Economy Class
## 1508 Unknown Solo Leisure Economy Class
## 1509 Boeing 737 Family Leisure Economy Class
## 1510 A-340 Family Leisure Economy Class
## 1511 Unknown Family Leisure Economy Class
## 1512 Unknown Family Leisure Economy Class
## 1513 Boeing 737-8 Business Economy Class
## 1514 Unknown Business Economy Class
## 1515 Unknown Couple Leisure Economy Class
## 1516 Boeing 737-800 Family Leisure Economy Class
## 1517 Boeing 737/800 Couple Leisure Economy Class
## 1518 Unknown Family Leisure Economy Class
## 1519 Unknown Family Leisure Economy Class
## 1520 Boeing 747 Family Leisure Economy Class
## 1521 Unknown Couple Leisure Economy Class
## 1522 Boeing 737 800 Solo Leisure Economy Class
## 1523 Unknown Couple Leisure Economy Class
## 1524 Unknown Family Leisure Economy Class
## 1525 Boeing 737-800 Family Leisure Economy Class
## 1526 Boeing 737-800 Solo Leisure Economy Class
## 1527 Unknown Family Leisure Economy Class
## 1528 Boeing 737-800 Family Leisure Economy Class
## 1529 Unknown Couple Leisure Economy Class
## 1530 Unknown Family Leisure Economy Class
## 1531 Unknown Couple Leisure Economy Class
## 1532 Unknown Couple Leisure Economy Class
## 1533 Unknown Couple Leisure Economy Class
## 1534 Boeing 737-8AS Couple Leisure Economy Class
## 1535 Unknown Solo Leisure Economy Class
## 1536 Boeing 737-800 Solo Leisure Economy Class
## 1537 Boeing 737-800 Business Economy Class
## 1538 Unknown Family Leisure Economy Class
## 1539 Boeing 737-800 Solo Leisure First Class
## 1540 Boeing 737 Solo Leisure Economy Class
## 1541 Boeing 737 Couple Leisure Economy Class
## 1542 Unknown Family Leisure Economy Class
## 1543 Unknown Family Leisure Economy Class
## 1544 Unknown Family Leisure Economy Class
## 1545 Unknown Family Leisure Economy Class
## 1546 Boeing 737 Couple Leisure Economy Class
## 1547 Boeing 737-800WL Family Leisure Economy Class
## 1548 Boeing 737-800 Solo Leisure Economy Class
## 1549 Unknown Solo Leisure Economy Class
## 1550 Unknown Couple Leisure Economy Class
## 1551 Unknown Couple Leisure Economy Class
## 1552 Boeing 737-800 Family Leisure Economy Class
## 1553 Boeing 737-800 Solo Leisure Economy Class
## 1554 Boeing 737 Couple Leisure Economy Class
## 1555 Boeing 737 Solo Leisure Economy Class
## 1556 Unknown Couple Leisure Economy Class
## 1557 Unknown Couple Leisure Economy Class
## 1558 Boeing 737-800 Family Leisure Economy Class
## 1559 Unknown Family Leisure Economy Class
## 1560 Boeing 737 Business Economy Class
## 1561 Unknown Family Leisure Economy Class
## 1562 Unknown Family Leisure Economy Class
## 1563 Unknown Family Leisure Economy Class
## 1564 Unknown Family Leisure Economy Class
## 1565 Unknown Couple Leisure Economy Class
## 1566 Unknown Family Leisure Economy Class
## 1567 Unknown Solo Leisure Economy Class
## 1568 Unknown Solo Leisure Economy Class
## 1569 Boeing 737-800 Family Leisure Economy Class
## 1570 Boeing 737-800 Solo Leisure Economy Class
## 1571 Unknown Couple Leisure Economy Class
## 1572 Boeing 737-800 Solo Leisure Economy Class
## 1573 Boeing 737 Solo Leisure Economy Class
## 1574 Unknown Solo Leisure Economy Class
## 1575 Unknown Solo Leisure Economy Class
## 1576 Unknown Solo Leisure Economy Class
## 1577 Unknown Solo Leisure Economy Class
## 1578 Unknown Solo Leisure Economy Class
## 1579 Unknown Solo Leisure Economy Class
## 1580 Unknown Couple Leisure Economy Class
## 1581 Unknown Unknown Economy Class
## 1582 Unknown Unknown Economy Class
## 1583 Unknown Unknown Economy Class
## 1584 Unknown Unknown Economy Class
## 1585 Unknown Unknown Economy Class
## 1586 Unknown Unknown Economy Class
## 1587 Unknown Unknown Economy Class
## 1588 Unknown Unknown Economy Class
## 1589 Unknown Unknown Economy Class
## 1590 Unknown Unknown Economy Class
## 1591 Unknown Unknown Economy Class
## 1592 Unknown Unknown Economy Class
## 1593 Unknown Unknown Economy Class
## 1594 Unknown Unknown Economy Class
## 1595 Unknown Unknown Economy Class
## 1596 Unknown Unknown Economy Class
## 1597 Unknown Unknown Economy Class
## 1598 Unknown Unknown Economy Class
## 1599 Unknown Unknown Economy Class
## 1600 Unknown Unknown Economy Class
## 1601 Unknown Unknown Economy Class
## 1602 Unknown Unknown Economy Class
## 1603 Unknown Unknown Economy Class
## 1604 Unknown Unknown Economy Class
## 1605 Unknown Unknown Economy Class
## 1606 Unknown Unknown Economy Class
## 1607 Unknown Unknown Economy Class
## 1608 Unknown Unknown Economy Class
## 1609 Unknown Unknown Economy Class
## 1610 Unknown Unknown Economy Class
## 1611 Unknown Unknown Economy Class
## 1612 Unknown Unknown Economy Class
## 1613 Unknown Unknown Economy Class
## 1614 Unknown Unknown Economy Class
## 1615 Unknown Unknown Economy Class
## 1616 Unknown Unknown Economy Class
## 1617 Unknown Unknown Economy Class
## 1618 Unknown Unknown Economy Class
## 1619 Unknown Unknown Economy Class
## 1620 Unknown Unknown Economy Class
## 1621 Unknown Unknown Economy Class
## 1622 Unknown Unknown Economy Class
## 1623 Unknown Unknown Economy Class
## 1624 Unknown Unknown Economy Class
## 1625 Unknown Unknown Economy Class
## 1626 Unknown Unknown Economy Class
## 1627 Unknown Unknown Economy Class
## 1628 Unknown Unknown Economy Class
## 1629 Unknown Unknown Economy Class
## 1630 Unknown Unknown Economy Class
## 1631 Unknown Unknown Economy Class
## 1632 Unknown Unknown Economy Class
## 1633 Unknown Unknown Economy Class
## 1634 Unknown Unknown Economy Class
## 1635 Unknown Unknown Economy Class
## 1636 Unknown Unknown Economy Class
## 1637 Unknown Unknown Economy Class
## 1638 Unknown Unknown Economy Class
## 1639 Unknown Unknown Economy Class
## 1640 Unknown Unknown Economy Class
## 1641 Unknown Unknown Economy Class
## 1642 Unknown Unknown Economy Class
## 1643 Unknown Unknown Economy Class
## 1644 Unknown Unknown Economy Class
## 1645 Unknown Unknown Economy Class
## 1646 Unknown Unknown Business Class
## 1647 Unknown Unknown Economy Class
## 1648 Unknown Unknown Economy Class
## 1649 Unknown Unknown Economy Class
## 1650 Unknown Unknown Economy Class
## 1651 Unknown Unknown Economy Class
## 1652 Unknown Unknown Economy Class
## 1653 Unknown Unknown Economy Class
## 1654 Unknown Unknown Economy Class
## 1655 Unknown Unknown Economy Class
## 1656 Unknown Unknown Economy Class
## 1657 Unknown Unknown Economy Class
## 1658 Unknown Unknown Economy Class
## 1659 Unknown Unknown Economy Class
## 1660 Unknown Unknown Economy Class
## 1661 Unknown Unknown Economy Class
## 1662 Unknown Unknown Economy Class
## 1663 Unknown Unknown Economy Class
## 1664 Unknown Unknown Economy Class
## 1665 Unknown Unknown Economy Class
## 1666 Unknown Unknown Economy Class
## 1667 Unknown Unknown Economy Class
## 1668 Unknown Unknown Economy Class
## 1669 Unknown Unknown Economy Class
## 1670 Unknown Unknown Economy Class
## 1671 Unknown Unknown Economy Class
## 1672 Unknown Unknown Economy Class
## 1673 Unknown Unknown Economy Class
## 1674 Unknown Unknown Economy Class
## 1675 Unknown Unknown Economy Class
## 1676 Unknown Unknown Economy Class
## 1677 Unknown Unknown Economy Class
## 1678 Unknown Unknown Economy Class
## 1679 Unknown Unknown Economy Class
## 1680 Unknown Unknown Economy Class
## 1681 Unknown Unknown Economy Class
## 1682 Unknown Unknown Economy Class
## 1683 Unknown Unknown Economy Class
## 1684 Unknown Unknown Economy Class
## 1685 Unknown Unknown Economy Class
## 1686 Unknown Unknown Economy Class
## 1687 Unknown Unknown Economy Class
## 1688 Unknown Unknown Economy Class
## 1689 Unknown Unknown Economy Class
## 1690 Unknown Unknown Economy Class
## 1691 Unknown Unknown Economy Class
## 1692 Unknown Unknown Economy Class
## 1693 Unknown Unknown Economy Class
## 1694 Unknown Unknown Economy Class
## 1695 Unknown Unknown Economy Class
## 1696 Unknown Unknown Economy Class
## 1697 Unknown Unknown Economy Class
## 1698 Unknown Unknown Economy Class
## 1699 Unknown Unknown Economy Class
## 1700 Unknown Unknown Economy Class
## 1701 Unknown Unknown Economy Class
## 1702 Unknown Unknown Economy Class
## 1703 Unknown Unknown Economy Class
## 1704 Unknown Unknown Economy Class
## 1705 Unknown Unknown Economy Class
## 1706 Unknown Unknown Economy Class
## 1707 Unknown Unknown Economy Class
## 1708 Unknown Unknown Economy Class
## 1709 Unknown Unknown Economy Class
## 1710 Unknown Unknown Economy Class
## 1711 Unknown Unknown Economy Class
## 1712 Unknown Unknown Economy Class
## 1713 Unknown Unknown Economy Class
## 1714 Unknown Unknown Economy Class
## 1715 Unknown Unknown Economy Class
## 1716 Unknown Unknown Economy Class
## 1717 Unknown Unknown Economy Class
## 1718 Unknown Unknown Economy Class
## 1719 Unknown Unknown Economy Class
## 1720 Unknown Unknown Economy Class
## 1721 Unknown Unknown Economy Class
## 1722 Unknown Unknown Economy Class
## 1723 Unknown Unknown Economy Class
## 1724 Unknown Unknown Economy Class
## 1725 Unknown Unknown Economy Class
## 1726 Unknown Unknown Economy Class
## 1727 Unknown Unknown Economy Class
## 1728 Unknown Unknown Economy Class
## 1729 Unknown Unknown Economy Class
## 1730 Unknown Unknown Economy Class
## 1731 Unknown Unknown Economy Class
## 1732 Unknown Unknown Economy Class
## 1733 Unknown Unknown Economy Class
## 1734 Unknown Unknown Economy Class
## 1735 Unknown Unknown Economy Class
## 1736 Unknown Unknown Economy Class
## 1737 Unknown Unknown Economy Class
## 1738 Unknown Unknown Economy Class
## 1739 Unknown Unknown Economy Class
## 1740 Unknown Unknown Economy Class
## 1741 Unknown Unknown Economy Class
## 1742 Unknown Unknown Economy Class
## 1743 Unknown Unknown Economy Class
## 1744 Unknown Unknown Economy Class
## 1745 Unknown Unknown Economy Class
## 1746 Unknown Unknown Economy Class
## 1747 Unknown Unknown Economy Class
## 1748 Unknown Unknown Economy Class
## 1749 Unknown Unknown Economy Class
## 1750 Unknown Unknown Economy Class
## 1751 Unknown Unknown Economy Class
## 1752 Unknown Unknown Economy Class
## 1753 Unknown Unknown Economy Class
## 1754 Unknown Unknown Economy Class
## 1755 Unknown Unknown Economy Class
## 1756 Unknown Unknown Economy Class
## 1757 Unknown Unknown Economy Class
## 1758 Unknown Unknown Economy Class
## 1759 Unknown Unknown Economy Class
## 1760 Unknown Unknown Economy Class
## 1761 Unknown Unknown Economy Class
## 1762 Unknown Unknown Economy Class
## 1763 Unknown Unknown Economy Class
## 1764 Unknown Unknown Economy Class
## 1765 Unknown Unknown Economy Class
## 1766 Unknown Unknown Economy Class
## 1767 Unknown Unknown Economy Class
## 1768 Unknown Unknown Economy Class
## 1769 Unknown Unknown Economy Class
## 1770 Unknown Unknown Economy Class
## 1771 Unknown Unknown Economy Class
## 1772 Unknown Unknown Economy Class
## 1773 Unknown Unknown Economy Class
## 1774 Unknown Unknown Economy Class
## 1775 Unknown Unknown Economy Class
## 1776 Unknown Unknown Economy Class
## 1777 Unknown Unknown Economy Class
## 1778 Unknown Unknown Economy Class
## 1779 Unknown Unknown Economy Class
## 1780 Unknown Unknown Economy Class
## 1781 Unknown Unknown Economy Class
## 1782 Unknown Unknown Economy Class
## 1783 Unknown Unknown Economy Class
## 1784 Unknown Unknown Economy Class
## 1785 Unknown Unknown Economy Class
## 1786 Unknown Unknown Economy Class
## 1787 Unknown Unknown Economy Class
## 1788 Unknown Unknown Economy Class
## 1789 Unknown Unknown Economy Class
## 1790 Unknown Unknown Economy Class
## 1791 Unknown Unknown Economy Class
## 1792 Unknown Unknown Economy Class
## 1793 Unknown Unknown Economy Class
## 1794 Unknown Unknown Economy Class
## 1795 Unknown Unknown Economy Class
## 1796 Unknown Unknown Economy Class
## 1797 Unknown Unknown Economy Class
## 1798 Unknown Unknown Economy Class
## 1799 Unknown Unknown Economy Class
## 1800 Unknown Unknown Economy Class
## 1801 Unknown Unknown Economy Class
## 1802 Unknown Unknown Economy Class
## 1803 Unknown Unknown Economy Class
## 1804 Unknown Unknown Economy Class
## 1805 Unknown Unknown Economy Class
## 1806 Unknown Unknown Economy Class
## 1807 Unknown Unknown Economy Class
## 1808 Unknown Unknown Economy Class
## 1809 Unknown Unknown Economy Class
## 1810 Unknown Unknown Economy Class
## 1811 Unknown Unknown Economy Class
## 1812 Unknown Unknown Economy Class
## 1813 Unknown Unknown Economy Class
## 1814 Unknown Unknown Economy Class
## 1815 Unknown Unknown Economy Class
## 1816 Unknown Unknown Economy Class
## 1817 Unknown Unknown Economy Class
## 1818 Unknown Unknown Economy Class
## 1819 Unknown Unknown Economy Class
## 1820 Unknown Unknown Economy Class
## 1821 Unknown Unknown Economy Class
## 1822 Unknown Unknown Economy Class
## 1823 Unknown Unknown Economy Class
## 1824 Unknown Unknown Economy Class
## 1825 Unknown Unknown Economy Class
## 1826 Unknown Unknown Economy Class
## 1827 Unknown Unknown Economy Class
## 1828 Unknown Unknown Economy Class
## 1829 Unknown Unknown Economy Class
## 1830 Unknown Unknown Economy Class
## 1831 Unknown Unknown Economy Class
## 1832 Unknown Unknown Economy Class
## 1833 Unknown Unknown Economy Class
## 1834 Unknown Unknown Economy Class
## 1835 Unknown Unknown Economy Class
## 1836 Unknown Unknown Economy Class
## 1837 Unknown Unknown Economy Class
## 1838 Unknown Unknown Economy Class
## 1839 Unknown Unknown Economy Class
## 1840 Unknown Unknown Economy Class
## 1841 Unknown Unknown Economy Class
## 1842 Unknown Unknown Economy Class
## 1843 Unknown Unknown Economy Class
## 1844 Unknown Unknown Economy Class
## 1845 Unknown Unknown Economy Class
## 1846 Unknown Unknown Economy Class
## 1847 Unknown Unknown Economy Class
## 1848 Unknown Unknown Economy Class
## 1849 Unknown Unknown Economy Class
## 1850 Unknown Unknown Economy Class
## 1851 Unknown Unknown Economy Class
## 1852 Unknown Unknown Economy Class
## 1853 Unknown Unknown Economy Class
## 1854 Unknown Unknown Economy Class
## 1855 Unknown Unknown Economy Class
## 1856 Unknown Unknown Economy Class
## 1857 Unknown Unknown Economy Class
## 1858 Unknown Unknown Economy Class
## 1859 Unknown Unknown Economy Class
## 1860 Unknown Unknown Economy Class
## 1861 Unknown Unknown Economy Class
## 1862 Unknown Unknown Economy Class
## 1863 Unknown Unknown Economy Class
## 1864 Unknown Unknown Economy Class
## 1865 Unknown Unknown Economy Class
## 1866 Unknown Unknown Economy Class
## 1867 Unknown Unknown Economy Class
## 1868 Unknown Unknown Economy Class
## 1869 Unknown Unknown Economy Class
## 1870 Unknown Unknown Economy Class
## 1871 Unknown Unknown Economy Class
## 1872 Unknown Unknown Economy Class
## 1873 Unknown Unknown Economy Class
## 1874 Unknown Unknown Economy Class
## 1875 Unknown Unknown Economy Class
## 1876 Unknown Unknown Economy Class
## 1877 Unknown Unknown Economy Class
## 1878 Unknown Unknown Economy Class
## 1879 Unknown Unknown Economy Class
## 1880 Unknown Unknown Economy Class
## 1881 Unknown Unknown Economy Class
## 1882 Unknown Unknown Economy Class
## 1883 Unknown Unknown Economy Class
## 1884 Unknown Unknown Economy Class
## 1885 Unknown Unknown Economy Class
## 1886 Unknown Unknown Economy Class
## 1887 Unknown Unknown Economy Class
## 1888 Unknown Unknown Economy Class
## 1889 Unknown Unknown Economy Class
## 1890 Unknown Unknown Economy Class
## 1891 Unknown Unknown Economy Class
## 1892 Unknown Unknown Economy Class
## 1893 Unknown Unknown Economy Class
## 1894 Unknown Unknown Economy Class
## 1895 Unknown Unknown Economy Class
## 1896 Unknown Unknown Economy Class
## 1897 Unknown Unknown Economy Class
## 1898 Unknown Unknown Economy Class
## 1899 Unknown Unknown Economy Class
## 1900 Unknown Unknown Economy Class
## 1901 Unknown Unknown Economy Class
## 1902 Unknown Unknown Economy Class
## 1903 Unknown Unknown Economy Class
## 1904 Unknown Unknown Economy Class
## 1905 Unknown Unknown Economy Class
## 1906 Unknown Unknown Economy Class
## 1907 Unknown Unknown Economy Class
## 1908 Unknown Unknown Economy Class
## 1909 Unknown Unknown Economy Class
## 1910 Unknown Unknown Economy Class
## 1911 Unknown Unknown Economy Class
## 1912 Unknown Unknown Economy Class
## 1913 Unknown Unknown Economy Class
## 1914 Unknown Unknown Economy Class
## 1915 Unknown Unknown Economy Class
## 1916 Unknown Unknown Economy Class
## 1917 Unknown Unknown Economy Class
## 1918 Unknown Unknown Economy Class
## 1919 Unknown Unknown Economy Class
## 1920 Unknown Unknown Economy Class
## 1921 Unknown Unknown Economy Class
## 1922 Unknown Unknown Economy Class
## 1923 Unknown Unknown Economy Class
## 1924 Unknown Unknown Economy Class
## 1925 Unknown Unknown Economy Class
## 1926 Unknown Unknown Economy Class
## 1927 Unknown Unknown Economy Class
## 1928 Unknown Unknown Economy Class
## 1929 Unknown Unknown Economy Class
## 1930 Unknown Unknown Economy Class
## 1931 Unknown Unknown Economy Class
## 1932 Unknown Unknown Economy Class
## 1933 Unknown Unknown Economy Class
## 1934 Unknown Unknown Economy Class
## 1935 Unknown Unknown Economy Class
## 1936 Unknown Unknown Economy Class
## 1937 Unknown Unknown Economy Class
## 1938 Unknown Unknown Economy Class
## 1939 Unknown Unknown Economy Class
## 1940 Unknown Unknown Economy Class
## 1941 Unknown Unknown Economy Class
## 1942 Unknown Unknown Economy Class
## 1943 Unknown Unknown Economy Class
## 1944 Unknown Unknown Economy Class
## 1945 Unknown Unknown Economy Class
## 1946 Unknown Unknown Economy Class
## 1947 Unknown Unknown Economy Class
## 1948 Unknown Unknown Economy Class
## 1949 Unknown Unknown Economy Class
## 1950 Unknown Unknown Economy Class
## 1951 Unknown Unknown Economy Class
## 1952 Unknown Unknown Economy Class
## 1953 Unknown Unknown Economy Class
## 1954 Unknown Unknown Economy Class
## 1955 Unknown Unknown Economy Class
## 1956 Unknown Unknown Economy Class
## 1957 Unknown Unknown Economy Class
## 1958 Unknown Unknown Economy Class
## 1959 Unknown Unknown Economy Class
## 1960 Unknown Unknown Economy Class
## 1961 Unknown Unknown Economy Class
## 1962 Unknown Unknown Economy Class
## 1963 Unknown Unknown Economy Class
## 1964 Unknown Unknown Economy Class
## 1965 Unknown Unknown Economy Class
## 1966 Unknown Unknown Economy Class
## 1967 Unknown Unknown Economy Class
## 1968 Unknown Unknown Economy Class
## 1969 Unknown Unknown Economy Class
## 1970 Unknown Unknown Economy Class
## 1971 Unknown Unknown Economy Class
## 1972 Unknown Unknown Economy Class
## 1973 Unknown Unknown Economy Class
## 1974 Unknown Unknown Economy Class
## 1975 Unknown Unknown Economy Class
## 1976 Unknown Unknown Economy Class
## 1977 Unknown Unknown Economy Class
## 1978 Unknown Unknown Economy Class
## 1979 Unknown Unknown Economy Class
## 1980 Unknown Unknown Economy Class
## 1981 Unknown Unknown Economy Class
## 1982 Unknown Unknown Economy Class
## 1983 Unknown Unknown Economy Class
## 1984 Unknown Unknown Economy Class
## 1985 Unknown Unknown Economy Class
## 1986 Unknown Unknown Economy Class
## 1987 Unknown Unknown Economy Class
## 1988 Unknown Unknown Economy Class
## 1989 Unknown Unknown Economy Class
## 1990 Unknown Unknown Economy Class
## 1991 Unknown Unknown Economy Class
## 1992 Unknown Unknown Economy Class
## 1993 Unknown Unknown Economy Class
## 1994 Unknown Unknown Economy Class
## 1995 Unknown Unknown Economy Class
## 1996 Unknown Unknown Economy Class
## 1997 Unknown Unknown Economy Class
## 1998 Unknown Unknown Economy Class
## 1999 Unknown Unknown Economy Class
## 2000 Unknown Unknown Economy Class
## 2001 Unknown Unknown Economy Class
## 2002 Unknown Unknown Economy Class
## 2003 Unknown Unknown Economy Class
## 2004 Unknown Unknown Economy Class
## 2005 Unknown Unknown Economy Class
## 2006 Unknown Unknown Economy Class
## 2007 Unknown Unknown Economy Class
## 2008 Unknown Unknown Economy Class
## 2009 Unknown Unknown Economy Class
## 2010 Unknown Unknown Economy Class
## 2011 Unknown Unknown Economy Class
## 2012 Unknown Unknown Economy Class
## 2013 Unknown Unknown Economy Class
## 2014 Unknown Unknown Economy Class
## 2015 Unknown Unknown Economy Class
## 2016 Unknown Unknown Economy Class
## 2017 Unknown Unknown Economy Class
## 2018 Unknown Unknown Economy Class
## 2019 Unknown Unknown Economy Class
## 2020 Unknown Unknown Economy Class
## 2021 Unknown Unknown Economy Class
## 2022 Unknown Unknown Economy Class
## 2023 Unknown Unknown Economy Class
## 2024 Unknown Unknown Economy Class
## 2025 Unknown Unknown Economy Class
## 2026 Unknown Unknown Economy Class
## 2027 Unknown Unknown Economy Class
## 2028 Unknown Unknown Economy Class
## 2029 Unknown Unknown Economy Class
## 2030 Unknown Unknown Economy Class
## 2031 Unknown Unknown Economy Class
## 2032 Unknown Unknown Economy Class
## 2033 Unknown Unknown Economy Class
## 2034 Unknown Unknown Economy Class
## 2035 Unknown Unknown Economy Class
## 2036 Unknown Unknown Economy Class
## 2037 Unknown Unknown Economy Class
## 2038 Unknown Unknown Economy Class
## 2039 Unknown Unknown Economy Class
## 2040 Unknown Unknown Economy Class
## 2041 Unknown Unknown Economy Class
## 2042 Unknown Unknown Economy Class
## 2043 Unknown Unknown Economy Class
## 2044 Unknown Unknown Economy Class
## 2045 Unknown Unknown Economy Class
## 2046 Unknown Unknown Economy Class
## 2047 Unknown Unknown Economy Class
## 2048 Unknown Unknown Economy Class
## 2049 Unknown Unknown Economy Class
## 2050 Unknown Unknown Economy Class
## 2051 Unknown Unknown Economy Class
## 2052 Unknown Unknown Economy Class
## 2053 Unknown Unknown Economy Class
## 2054 Unknown Unknown Economy Class
## 2055 Unknown Unknown Economy Class
## 2056 Unknown Unknown Economy Class
## 2057 Unknown Unknown Economy Class
## 2058 Unknown Unknown Economy Class
## 2059 Unknown Unknown Economy Class
## 2060 Unknown Unknown Economy Class
## 2061 Unknown Unknown Economy Class
## 2062 Unknown Unknown Economy Class
## 2063 Unknown Unknown Economy Class
## 2064 Unknown Unknown Economy Class
## Origin Destination Date.Flown Seat.Comfort
## 1 Faro Luton February 2024 4
## 2 Belfast Alicante January 2024 3
## 3 Edinburgh Paris Beauvais October 2023 5
## 4 Faro Liverpool January 2024 3
## 5 Dublin Manchester January 2024 4
## 6 Copenhagen Gdansk January 2024 2
## 7 Stansted Pisa December 2023 2
## 8 Beauvais Barcelona January 2024 2
## 9 Cologne Palma de Mallorca November 2023 1
## 10 Krakow Tirana December 2023 3
## 11 Porto Barcelona December 2023 1
## 12 Cologne Bonn Stansted December 2023 1
## 13 Alicante Gatwick November 2023 1
## 14 Bristol Dublin November 2023 4
## 15 Lisbon Funchal November 2023 4
## 16 Leeds Faro October 2023 3
## 17 Venice Naples October 2023 4
## 18 Valencia Milan September 2023 1
## 19 Oslo Riga December 2022 4
## 20 Tel Aviv Paphos April 2023 2
## 21 Bergamo Kefalonia September 2023 3
## 22 Birmingham Corfu September 2023 2
## 23 Vienna Copenhagen September 2023 1
## 24 London La Rochelle September 2023 3
## 25 Stansted Vasteras August 2023 1
## 26 Charleroi Carcassonne September 2023 3
## 27 East Midlands Faro September 2023 1
## 28 Brussel Athens September 2023 1
## 29 Lisbon Stansted September 2023 1
## 30 Lisbon Madeira September 2023 2
## 31 Brussels Charleroi Alicante September 2023 1
## 32 Madrid Tanger September 2023 1
## 33 Beziers, France Bristol, UK July 2023 1
## 34 Hahn Stansted September 2023 2
## 35 Knock Luton August 2023 1
## 36 Malaga Lisbon August 2023 1
## 37 Burgas Bratislava August 2023 2
## 38 Barcelona Faro August 2023 1
## 39 Athens Vilnius August 2023 1
## 40 Rabat Rome August 2023 1
## 41 Bremen Chania August 2023 4
## 42 Rome Fiumicino Dublin July 2023 5
## 43 Rome Budapest August 2023 1
## 44 London Stansted Bordeaux July 2023 2
## 45 Marrakech Berlin April 2023 2
## 46 Cologne Barcelona August 2023 2
## 47 East Midlands Berlin July 2023 1
## 48 Stansted Limoges July 2023 2
## 49 Sofia Berlin July 2023 1
## 50 Shannon London Gatwick July 2023 2
## 51 Corfu Pisa July 2023 2
## 52 Berlin Venice October 2022 3
## 53 Santorini Athens July 2023 1
## 54 Brussels Belfast May 2023 3
## 55 Dublin Edinburgh July 2023 2
## 56 Bari Bergamo July 2023 1
## 57 Porto Rome July 2023 3
## 58 Athens Santorini June 2023 1
## 59 London Stansted Lisbon June 2023 1
## 60 Katowice Dortmund July 2023 3
## 61 Tel Aviv Charleroi June 2023 3
## 62 Vienna Edinburgh June 2023 2
## 63 Dublin Edinburgh June 2023 3
## 64 Madrid Marakkesh May 2023 1
## 65 Lisbon London May 2023 1
## 66 Edinburgh London Stansted June 2023 1
## 67 Edinburgh Stansted June 2023 2
## 68 Venice Brussels February 2023 2
## 69 Alicante Venice May 2023 1
## 70 Stansted Belfast May 2023 3
## 71 Lisbon Stansted May 2023 1
## 72 Ciampino Rome Manchester May 2023 3
## 73 Bologna Cologne May 2023 3
## 74 Venice Stansted March 2023 3
## 75 London Newquay May 2023 1
## 76 Krakow London Stansted May 2023 1
## 77 Rome Athens May 2023 1
## 78 Dublin Bristol May 2023 1
## 79 Bristol Dublin May 2023 2
## 80 Dublin Murcia May 2023 1
## 81 Alicante Dublin May 2023 2
## 82 Riga Newcastle May 2023 1
## 83 Tangiers Rome May 2023 1
## 84 Athens Warsaw May 2023 1
## 85 Ibiza Barcelona May 2023 1
## 86 Vienna Tenerife May 2023 2
## 87 Marseille Lisbon May 2023 2
## 88 Faro Marseille May 2023 2
## 89 Dortmund London Stansted May 2023 5
## 90 London Stansted Dortmund April 2023 5
## 91 Copenhagen Dublin April 2023 2
## 92 Stansted Athens April 2023 1
## 93 Vienna Banja Luka April 2023 2
## 94 Frankfurt Vilnius April 2023 4
## 95 Milan Stansted April 2023 2
## 96 Faro Stansted April 2023 5
## 97 Stansted Venice March 2023 1
## 98 Venice Stansted April 2023 3
## 99 Madeira Lisbon April 2023 2
## 100 Venice Dublin April 2023 3
## 101 Berlin Milan Bergamo April 2023 1
## 102 Oslo Stansted April 2023 2
## 103 Venice Naples April 2023 1
## 104 Vienna Copenhagen April 2023 1
## 105 Brussels Catania March 2023 1
## 106 Valencia Manchester March 2023 2
## 107 Zagreb Malaga March 2023 3
## 108 Bristol Cologne March 2023 3
## 109 Landvetter Malaga March 2023 1
## 110 Birmingham Dublin March 2023 1
## 111 Stansted Pisa March 2023 2
## 112 Lisbon Madeira March 2023 4
## 113 Gothenburg Barcelona February 2023 1
## 114 Dublin Rome February 2023 2
## 115 Bodrum Dublin February 2023 1
## 116 Stansted Budapest February 2023 4
## 117 Seville Dublin February 2023 1
## 118 Tel Aviv Paphos January 2023 3
## 119 Tallinn Dublin January 2023 3
## 120 Bologna Edinburgh August 2022 3
## 121 Edinburgh Fuerteventura January 2023 4
## 122 Stansted Faro September 2022 1
## 123 Dublin Bodrum January 2023 3
## 124 Biarritz Brussels May 2022 2
## 125 Cardiff Faro January 2023 3
## 126 Tel Aviv Berlin November 2022 1
## 127 London Dublin December 2022 1
## 128 Eindhoven Maastricht January 2023 1
## 129 Santorini Athens August 2022 1
## 130 Lisbon Funchal December 2022 1
## 131 Dublin Gran Canaria December 2022 4
## 132 Krakow Eindhoven December 2022 1
## 133 Alicante Stansted December 2022 5
## 134 Helsinki R\304\253ga December 2022 5
## 135 Vienna Riga September 2022 1
## 136 London Wroclaw December 2022 2
## 137 Bristol Tenerife August 2022 3
## 138 Birmingham Dublin August 2022 3
## 139 Nis Stockholm July 2022 1
## 140 Lisbon Milan Bergamo November 2022 2
## 141 Leeds Bradford Malaga November 2022 1
## 142 Madrid Faro November 2022 1
## 143 Madeira Lisbon October 2022 1
## 144 Bristol Krakow November 2022 2
## 145 Fuerteventura Stansted November 2022 1
## 146 Stansted Fuerteventura November 2022 1
## 147 Venice Nuremberg November 2022 3
## 148 Barcelona Warsaw November 2022 1
## 149 Malaga Tangier October 2022 3
## 150 Bodrum Dublin October 2022 2
## 151 Santorini Athens October 2022 3
## 152 Vilnius Leeds October 2022 1
## 153 Oslo Stansted October 2022 1
## 154 Marseille Faro October 2022 2
## 155 Dublin Edinburgh October 2022 1
## 156 Amsterdam Malaga August 2022 2
## 157 Budapest Athens October 2022 1
## 158 Porto Milan (Linate) July 2022 1
## 159 Lisbon Edinburgh October 2022 1
## 160 Dublin Dalaman September 2022 1
## 161 Stockholm Alicante September 2022 2
## 162 Dublin Marrakech via Madrid September 2022 1
## 163 Hungary Warsaw September 2022 1
## 164 Dublin Budapest August 2022 1
## 165 Stansted Maastricht August 2022 3
## 166 Dublin Stansted September 2022 1
## 167 Brussels Liverpool August 2022 3
## 168 Paris Beauvais Seville July 2022 2
## 169 Brussels Charleroi Stockholm August 2022 3
## 170 Bordeaux Lisbon August 2022 1
## 171 Edinburgh Dublin July 2022 2
## 172 Manchester Milan February 2022 3
## 173 Liverpool Bergerac August 2022 2
## 174 Porto Paris August 2022 1
## 175 Amsterdam Dublin June 2022 2
## 176 Helsinki London Stansted July 2022 1
## 177 Edinburgh Santiago July 2022 1
## 178 Palermo Stansted July 2022 3
## 179 Riga Berlin July 2022 1
## 180 Amsterdam Dublin January 2022 3
## 181 Chania Stockholm August 2022 1
## 182 Palma Manchester July 2022 1
## 183 Stansted Rimini July 2022 3
## 184 Birmingham Barcelona July 2022 5
## 185 Valencia Faro July 2022 1
## 186 Tenerife Luton July 2022 1
## 187 Luton Tenerife South July 2022 3
## 188 Chania Dublin July 2022 1
## 189 Prague Dublin April 2022 3
## 190 Malta Luton July 2022 1
## 191 Lisbon Luxembourg July 2022 1
## 192 Corfu Stockholm Arlanda July 2022 1
## 193 Corfu Stockholm Arlanda July 2022 1
## 194 Madrid Menorca July 2022 3
## 195 London Kotor February 2022 1
## 196 Bucharest Edinburgh July 2022 1
## 197 Porto Funchal July 2022 1
## 198 Genoa Wien July 2022 1
## 199 Tel Aviv Budapest April 2022 3
## 200 Lulea Stockholm July 2022 1
## 201 Leeds/Bradford Faro June 2022 2
## 202 Berlin Dublin November 2021 3
## 203 Vilnius Leeds June 2022 3
## 204 Marseille Bucharest June 2022 1
## 205 Prague Stansted April 2022 2
## 206 Prague Marseille July 2022 1
## 207 Barcelona Dublin June 2022 1
## 208 Amman Brussels July 2021 1
## 209 Brussels Gran Canaria June 2022 4
## 210 Thessaloniki Stansted June 2022 2
## 211 Tel-Aviv Berlin June 2022 1
## 212 Brussels Budapest June 2022 1
## 213 Manchester Rome May 2022 1
## 214 Edinburgh Malta May 2022 1
## 215 Alicante Paris June 2022 1
## 216 Birmingham Bordeaux June 2022 4
## 217 Berlin Edinburgh June 2022 1
## 218 Aberdeen Faro May 2022 3
## 219 Cologne Manchester May 2022 3
## 220 Seville Malta May 2022 2
## 221 London Budapest May 2022 2
## 222 Manchester Torp May 2022 1
## 223 Palma London May 2022 1
## 224 Paris Zagreb May 2022 1
## 225 Faro Birmingham May 2022 4
## 226 Leeds Majorca May 2022 2
## 227 Stansted Lamezia May 2022 3
## 228 Manchester Cork May 2022 2
## 229 Thessaloniki Stansted April 2022 1
## 230 Faro Newcastle April 2022 2
## 231 Fuerteventura Luton April 2022 1
## 232 Krakow Bordeaux March 2022 3
## 233 Pisa Palermo April 2022 1
## 234 Malaga Newcastle March 2022 2
## 235 Helsinki Bergamo Italy March 2022 1
## 236 London Oslo February 2022 1
## 237 Bergamo Brussels South March 2022 1
## 238 Faro Stansted October 2021 1
## 239 Alicante Shannon March 2022 4
## 240 Tenerife Dublin March 2022 1
## 241 Milan Stansted March 2022 2
## 242 Manchester Kerry February 2022 3
## 243 Tallinn Edinburgh March 2022 1
## 244 Barcelona Prague February 2022 1
## 245 London Stansted Malaga December 2021 1
## 246 Madrid Rome February 2022 2
## 247 Tel Aviv Milan Bergamo February 2022 1
## 248 Poznan Birmingham February 2022 1
## 249 Brussels Tel Aviv February 2022 3
## 250 Stockholm Stansted January 2022 2
## 251 Frankfurt Catania December 2021 2
## 252 Dublin Madrid September 2021 1
## 253 Marseille Nantes January 2021 2
## 254 Berlin Tel Aviv December 2021 2
## 255 Stansted Toulouse November 2021 2
## 256 Lisbon Dublin December 2021 1
## 257 Bristol Milan November 2021 3
## 258 Prestwick Arrecife November 2021 3
## 259 Tel Aviv-Yafo Paphos November 2021 1
## 260 Tallinn Paris November 2021 2
## 261 Odesa Corfu August 2021 5
## 262 Paphos Valletta November 2021 3
## 263 Rome Budapest October 2021 1
## 264 Cologne Bergamo November 2021 3
## 265 Bologna London Stansted November 2021 1
## 266 Manchester Budapest November 2021 1
## 267 Crete (Chania) Athens September 2021 1
## 268 Stansted Rome Ciampino November 2021 1
## 269 Valencia Palma de Mallorca November 2021 2
## 270 Frankfurt Barcelona November 2021 3
## 271 Bristol Knock October 2021 2
## 272 Alicante Stansted October 2021 3
## 273 London Berlin October 2021 1
## 274 Bergamo Stansted October 2021 1
## 275 Corfu Southend October 2021 1
## 276 Barcelona Paris Beauvais September 2021 2
## 277 London Madrid September 2021 5
## 278 Valencia Milan September 2021 1
## 279 Kyiv Krakow September 2021 5
## 280 Stansted Shannon June 2021 1
## 281 London Rodez September 2021 1
## 282 London Stansted Rome Ciampino July 2021 2
## 283 Vienna Tel Aviv September 2021 2
## 284 Frankfurt Athens August 2021 3
## 285 Yerevan Vienna August 2021 2
## 286 Athens Dublin July 2021 1
## 287 Sofia Milan July 2021 2
## 288 Budapest Stansted July 2021 1
## 289 London Crete July 2021 1
## 290 Cologne Vienna July 2021 2
## 291 Barcelona Ibiza July 2021 1
## 292 Sofia Venice July 2021 3
## 293 Budapest Rome July 2021 1
## 294 Malaga Palma July 2021 4
## 295 Bezier Brussels July 2021 2
## 296 Prague Bologna July 2021 2
## 297 Amsterdam Dublin December 2020 2
## 298 Eindhoven Pisa June 2021 3
## 299 Brussels Vienna July 2020 1
## 300 Santorini Athens June 2021 1
## 301 Budapest Rome May 2021 3
## 302 Alicante Liverpool October 2020 1
## 303 Stansted Bologna April 2021 5
## 304 Stansted Podgorica January 2021 2
## 305 Luton Tenerife February 2021 2
## 306 Stansted Malaga February 2021 2
## 307 Stansted Prague October 2020 2
## 308 Alicante London January 2021 2
## 309 Barcelona Frankfurt December 2020 5
## 310 East Midlands Alicante October 2020 1
## 311 Dublin Amsterdam December 2020 1
## 312 East Midlands Riga December 2020 2
## 313 Milan Luxembourg December 2020 2
## 314 Stansted Thessaloniki October 2020 5
## 315 Malaga Brussels October 2020 5
## 316 London Stansted Krakow October 2020 2
## 317 London Stansted Perugia September 2020 3
## 318 Catania Cracow September 2020 3
## 319 Birmingham Malaga September 2020 2
## 320 Paphos Stansted September 2020 2
## 321 Edinburgh Tenerife August 2020 4
## 322 Dublin Warsaw August 2020 1
## 323 Manchester Rhodes June 2020 2
## 324 Dublin Luton August 2020 2
## 325 Manchester Naples July 2020 2
## 326 Birmingham Murcia May 2020 2
## 327 Budapest Manchester May 2020 2
## 328 Lisbon Vienna July 2020 2
## 329 Lisbon Lourdes August 2020 4
## 330 Lappeenranta Milan September 2019 2
## 331 Dublin Brussels August 2020 1
## 332 Munich Palma de Mallorca July 2020 3
## 333 Birmingham Porto July 2020 3
## 334 Lanzarote Stansted April 2020 2
## 335 Dublin Barcelona March 2020 2
## 336 Stansted Brindisi July 2020 3
## 337 Dublin Dalaman July 2020 5
## 338 Luton Knock July 2020 4
## 339 Lisbon Ponta Delgada July 2020 3
## 340 Manchester Rome June 2020 2
## 341 Luton Tenerife south December 2019 2
## 342 Stansted Prague April 2020 2
## 343 Bristol Lanzarote May 2020 2
## 344 Bruxelles Warsaw January 2020 2
## 345 London Zaragoza March 2020 2
## 346 Tenerife South Brussels March 2020 2
## 347 Copenhagen London May 2019 2
## 348 Bucharest Vienna March 2020 2
## 349 Dublin London January 2020 1
## 350 Budapest Rome Ciampino January 2020 3
## 351 Exeter Malaga April 2020 2
## 352 Eindhoven Stansted December 2019 2
## 353 Marrakech Gatwick March 2020 2
## 354 Exeter Malaga March 2020 2
## 355 Riga Dublin March 2020 2
## 356 Shannon London Gatwick October 2019 3
## 357 Copenhagen Cologne March 2020 2
## 358 Luton Kaunas March 2020 2
## 359 Stansted Bremen March 2020 2
## 360 Manchester Prague March 2020 5
## 361 Bologna Berlin March 2020 2
## 362 Eindhoven Porto March 2020 1
## 363 Thessaloniki Stansted March 2020 1
## 364 London Stansted Warsaw November 2019 1
## 365 Copenhagen Dublin February 2020 1
## 366 Gothenburg London February 2020 4
## 367 Berlin Brussels February 2020 1
## 368 Krakow Edinburgh February 2020 1
## 369 Rome Ciampino Eindhoven February 2020 1
## 370 Cork Malaga September 2019 5
## 371 Berlin Kerry January 2020 2
## 372 Krakow Treviso August 2019 3
## 373 Rome-Ciampino Dublin February 2020 4
## 374 Gatwick Dublin February 2020 1
## 375 Budapest Stansted February 2020 2
## 376 Budapest Lisbon February 2020 1
## 377 Stansted Seville February 2020 1
## 378 Bologna Cologne February 2020 1
## 379 Malaga London February 2020 1
## 380 Stansted Fuerteventura February 2020 3
## 381 Jasionka Bristol October 2019 3
## 382 Brussels Charleroi Stockholm February 2020 4
## 383 Eindhoven Athens February 2020 1
## 384 Sandefjord, Torp Manchester February 2020 1
## 385 Barcelona Porto February 2020 1
## 386 Dublin Copenhagen February 2020 3
## 387 Alicante London Stansted January 2020 3
## 388 London Stansted Bari February 2020 3
## 389 Malta Catania February 2020 1
## 390 Gatwick Dublin January 2020 4
## 391 Sofia Einhoven January 2020 1
## 392 Faro Berlin January 2020 4
## 393 Alicante Leeds January 2020 1
## 394 Tenerife Manchester January 2020 1
## 395 Leeds Bradford Riga July 2019 1
## 396 Edinburgh Malaga January 2020 4
## 397 Stansted Tenerife December 2019 2
## 398 Barcelona Seville January 2020 5
## 399 Liverpool Derry January 2020 1
## 400 Madrid Dublin January 2020 1
## 401 Lisbon Malaga December 2019 3
## 402 Milan Bergamo Dublin January 2020 2
## 403 Prague Edinburgh November 2019 4
## 404 Paris Vienna January 2020 1
## 405 Ponta Delgado Lisbon January 2020 1
## 406 Dublin London Stansted January 2020 1
## 407 Budapest Barcelona August 2019 1
## 408 Madrid London (Stansted) December 2019 1
## 409 Valencia Bristol January 2020 1
## 410 Eindhoven Ibiza March 2019 1
## 411 Eindhoven Lisbon December 2019 2
## 412 Bristol Krakow January 2020 3
## 413 Luton Dublin December 2019 1
## 414 Barcelona Frankfurt January 2020 2
## 415 Ibiza Madrid January 2020 1
## 416 Bucharest Berlin December 2019 1
## 417 Venice Paris December 2019 1
## 418 Manchester Venice December 2019 3
## 419 Brussels Dublin December 2019 3
## 420 Stansted Copenhagen December 2019 2
## 421 Madrid Stansted December 2019 2
## 422 Stansted Barcelona December 2019 1
## 423 Malaga Brussels December 2019 1
## 424 Stansted Budapest December 2019 2
## 425 Lisbon Rome December 2019 2
## 426 Glasgow Krakow July 2019 1
## 427 Frankfurt Malaga August 2019 5
## 428 Brindisi Stansted December 2019 3
## 429 Stansted Copenhagen December 2019 2
## 430 Edinburgh Nantes September 2019 3
## 431 Seville Morocco December 2019 1
## 432 Venice Stansted November 2019 2
## 433 Essaouira Brussels November 2019 1
## 434 Athens Santorini October 2019 1
## 435 Dublin Berlin November 2019 1
## 436 Madrid Bari November 2019 2
## 437 Dublin Malaga November 2019 3
## 438 Barcelona Rome October 2019 1
## 439 Birmingham Barcelona November 2019 1
## 440 Amsterdam Dublin November 2019 1
## 441 London Stansted Barcelona November 2019 2
## 442 Lisbon Milan November 2019 2
## 443 Kerry Luton November 2019 3
## 444 Bologna Stansted November 2019 1
## 445 Nice Dublin October 2019 1
## 446 London Stansted Bordeaux November 2019 1
## 447 Manchester Rome Ciampino November 2019 1
## 448 Seville Marrakech September 2019 1
## 449 London Milan November 2019 1
## 450 Gran Canaria Barcelona November 2019 1
## 451 London Luton Vilnius November 2019 2
## 452 Stansted Athens November 2019 1
## 453 Munich Dublin November 2019 5
## 454 Bratislava Dublin October 2019 4
## 455 Toulouse Brussels November 2019 3
## 456 Lisbon Valencia November 2019 2
## 457 Venice Barcelona November 2019 1
## 458 Stansted Tallinn October 2019 3
## 459 Bournemouth Palma October 2019 1
## 460 Rome Vienna November 2019 2
## 461 Tel Aviv Paphos November 2019 2
## 462 Oslo Stansted September 2019 2
## 463 Knock Liverpool October 2019 4
## 464 Berlin Gran Canaria October 2019 2
## 465 Stansted Trieste October 2019 2
## 466 Malaga Dublin October 2019 3
## 467 Birmingham Chania October 2019 2
## 468 Chania Stansted October 2019 1
## 469 Budapest Stansted October 2019 2
## 470 Eindhoven Dublin April 2019 2
## 471 Dublin Manchester October 2019 1
## 472 Edinburgh Alicante October 2019 3
## 473 Palma Prestwick October 2019 2
## 474 Barcelona Manchester October 2019 2
## 475 Fes Paris October 2019 1
## 476 Amsterdam Dublin October 2019 1
## 477 Beauvais Bratislava October 2019 4
## 478 Ibiza Milano Bergamo September 2019 1
## 479 Prague Bologna October 2019 1
## 480 Lanzarote Liverpool October 2019 3
## 481 London Barcelona October 2019 2
## 482 Seville Valencia October 2019 1
## 483 Berlin Edinburgh October 2019 1
## 484 Manchester Majorca November 2018 1
## 485 Ibiza Glasgow October 2019 1
## 486 Nuremberg Bergamo October 2019 3
## 487 Porto Madrid October 2019 1
## 488 Prague Barcelona October 2019 2
## 489 Barcelona Rome October 2019 1
## 490 Manchester Belfast October 2019 2
## 491 London Pescara October 2019 1
## 492 Manchester Marrakesh September 2019 1
## 493 Stansted Thessaloniki October 2019 1
## 494 Madrid Porto October 2019 2
## 495 London Stansted Barcelona October 2019 2
## 496 Barcelona Kiev September 2019 1
## 497 Naples Frankfurt Hahn November 2019 2
## 498 Dublin Glasgow October 2019 3
## 499 Dublin Gatwick October 2019 1
## 500 Menorca Madrid August 2019 2
## 501 Venice London Stansted October 2019 2
## 502 Gatwick Shannon October 2019 1
## 503 Las Palmas Birmingham September 2019 1
## 504 Weeze Valencia September 2019 3
## 505 Brussel Berlin August 2019 2
## 506 Salzburg Stansted September 2019 1
## 507 Dublin Split September 2019 4
## 508 Cardiff Malaga September 2019 5
## 509 Berlin Madrid September 2019 1
## 510 Brussels Milan September 2019 1
## 511 Rome Seville September 2019 2
## 512 Rome Lisbon September 2019 1
## 513 Bologna Bucharest September 2019 1
## 514 Prague Stansted September 2019 2
## 515 Manchester Riga September 2019 4
## 516 Dublin Milan September 2019 1
## 517 Southend Alicante September 2019 5
## 518 Frankfurt Valencia September 2019 1
## 519 Bari Rome September 2019 1
## 520 Ibiza Barcelona September 2019 4
## 521 Barcelona Berlin September 2019 1
## 522 Dublin Bergamo September 2019 4
## 523 Dublin Edinburgh September 2019 1
## 524 London Venice August 2019 1
## 525 Frankfurt Dublin September 2019 2
## 526 Manchester Riga September 2019 4
## 527 Ibiza Leeds September 2019 1
## 528 Edinburgh Palma September 2019 1
## 529 Rome Budapest October 2018 2
## 530 Dubrovnik Dublin September 2019 2
## 531 Berlin Palma de Mallorca September 2019 1
## 532 Hamburg Dublin September 2019 2
## 533 Stansted Barcelona September 2019 1
## 534 Dublin Amsterdam September 2019 1
## 535 Milan Cagliari October 2018 2
## 536 Amsterdam Dublin September 2019 1
## 537 Rome Barcelona September 2019 1
## 538 Shannon Malaga September 2019 2
## 539 Barcelona Palma August 2019 3
## 540 Shannon Manchester September 2019 2
## 541 Barcelona Manchester September 2019 1
## 542 Bucharest Bergamo March 2019 2
## 543 Bordeaux Copenhagen September 2019 2
## 544 Athens Santorini September 2019 1
## 545 Cologne Marrakech September 2019 2
## 546 Paphos Stansted September 2019 1
## 547 Copenhagen Stansted September 2019 1
## 548 Dublin Berlin September 2019 2
## 549 Leeds Faro September 2019 1
## 550 Stansted Rome September 2019 2
## 551 Leeds Ibiza September 2019 1
## 552 Santorini Athens August 2019 2
## 553 Budapest Prague August 2019 2
## 554 Mallorca Edinburgh August 2019 1
## 555 Rome Paris August 2019 1
## 556 Athens Sophia July 2019 1
## 557 Stansted Porto August 2019 4
## 558 Stansted Knock August 2019 2
## 559 Barcelona Cardiff August 2019 3
## 560 Pisa Stansted August 2019 2
## 561 Alicante Newcastle August 2019 1
## 562 Bristol Venice August 2019 2
## 563 Barcelona Liverpool August 2019 1
## 564 Stansted Paphos August 2019 3
## 565 Warsaw Stockholm Skavsta July 2019 3
## 566 Alicante Liverpool August 2019 2
## 567 Barcelona Edinburgh August 2019 1
## 568 Budapest Edinburgh August 2019 1
## 569 Manchester Rhodes August 2019 3
## 570 Faro London Southend August 2019 1
## 571 Manchester Belfast August 2019 3
## 572 Faro Bournemouth August 2019 1
## 573 Exeter Malta May 2019 1
## 574 Belfast Alicante August 2019 1
## 575 Barcelona Santander August 2019 2
## 576 London (Stansted) Malaga May 2019 2
## 577 London Athens August 2019 1
## 578 Lisbon Stansted August 2019 3
## 579 Ponta DelGada Manchester August 2019 1
## 580 Luton Kerry August 2019 3
## 581 Stansted Rabat August 2019 2
## 582 Dublin Hamburg August 2019 2
## 583 London Luton Kerry August 2019 3
## 584 Budapest Rome May 2019 3
## 585 Rabat Madrid August 2019 1
## 586 Faro Bristol August 2019 3
## 587 Beauvais Vilnius August 2019 2
## 588 Gatwick Vienna August 2019 1
## 589 Athens Luton August 2019 3
## 590 Stansted Brno July 2019 3
## 591 Stansted Aarhus July 2019 3
## 592 Knock Bristol July 2019 4
## 593 Budapest Prague July 2019 2
## 594 Birmingham Barcelona July 2019 3
## 595 Strasbourg Stansted July 2019 5
## 596 Stansted Shannon July 2019 1
## 597 Barcelona Rome July 2019 1
## 598 Leeds bradford Dublin July 2019 1
## 599 Gran Canaria Stansted July 2019 1
## 600 Billund Manchester July 2019 5
## 601 Stansted Arrecife July 2019 3
## 602 Pescara Stansted July 2019 1
## 603 Birmingham Chania July 2019 1
## 604 Edinburgh Dublin July 2019 1
## 605 Barcelona Rome July 2019 1
## 606 Dublin East Midlands July 2019 1
## 607 Luton Faro July 2019 1
## 608 Manchester Dublin July 2019 4
## 609 Dublin Manchester July 2019 4
## 610 Bucharest Dublin July 2019 4
## 611 Porto Barcelona June 2019 2
## 612 Manchester Palma July 2019 1
## 613 Budapest Prague July 2019 3
## 614 Manchester Limoges April 2019 1
## 615 Dublin Frankfurt July 2019 2
## 616 Bournemouth Gran Canaria June 2019 1
## 617 Edinburgh Luxembourg July 2019 2
## 618 Rome Stansted July 2019 1
## 619 Naples Barcelona July 2019 1
## 620 Barcelona Naples July 2019 2
## 621 Santorini Athens July 2019 1
## 622 Madrid Manchester June 2019 4
## 623 Berlin Budapest June 2019 2
## 624 London Gatwick Dublin June 2019 3
## 625 Amsterdam Dublin June 2019 2
## 626 Pisa Dublin June 2019 2
## 627 Porto Stansted September 2018 1
## 628 Kiev Stansted June 2019 1
## 629 Palma London Stansted June 2019 3
## 630 Prague Liverpool June 2019 4
## 631 Faro Eindhoven June 2019 3
## 632 Athens Catania June 2019 4
## 633 Bergerac Stansted June 2019 5
## 634 Barcelona Prague June 2019 2
## 635 Athens Santorini June 2019 1
## 636 Murcia Luton June 2019 1
## 637 Dublin Barcelona May 2019 2
## 638 Stansted Rhodes June 2019 2
## 639 Gatwick Dublin June 2019 2
## 640 Manchester Barcelona May 2019 2
## 641 Lisbon Berlin May 2019 3
## 642 Copenhagen Stansted June 2019 3
## 643 Stansted Bucharest May 2019 1
## 644 Porto Barcelona June 2019 2
## 645 Milan Bergamo Tel Aviv May 2019 1
## 646 Vienna Stansted May 2019 3
## 647 London Gatwick Dublin May 2019 2
## 648 Lisbon Manchester May 2019 1
## 649 Brussels Barcelona May 2019 1
## 650 Cluj Napoca Southend May 2019 3
## 651 Malaga Berlin May 2019 1
## 652 Luton Girona May 2019 3
## 653 Edinburgh Malaga May 2019 2
## 654 Brussels Barcelona May 2019 4
## 655 Milan Madrid May 2019 3
## 656 Stansted Rabat May 2019 1
## 657 Luton Athens May 2019 1
## 658 Faro Stansted May 2019 4
## 659 Stansted Lanzarote April 2019 1
## 660 Rome Eindhoven April 2019 4
## 661 Venice London Stansted May 2019 1
## 662 Berlin Athens May 2019 1
## 663 Belfast Manchester May 2019 1
## 664 Edinburgh Barcelona May 2019 1
## 665 Stansted Bucharest May 2019 2
## 666 Leeds Bradford Malaga May 2019 1
## 667 Malta Stansted May 2019 1
## 668 Gatwick Alicante May 2019 1
## 669 Berlin Budapest May 2019 2
## 670 Corfu Southend May 2019 3
## 671 East Midlands Barcelona May 2019 2
## 672 London Lisbon April 2019 1
## 673 Bucharest Madrid May 2019 1
## 674 Berlin Athens May 2019 1
## 675 Milan Bergamo Brindisi May 2019 4
## 676 Dublin Malta April 2019 1
## 677 Bristol Tenerife April 2019 2
## 678 Copenhagen Stuttgart April 2019 2
## 679 London Gatwick Dublin April 2019 1
## 680 Krakow Rome April 2019 1
## 681 Alicante Birmingham April 2019 2
## 682 Stansted Naples April 2019 1
## 683 Bologna Barcelona March 2019 2
## 684 Manchester Venice Treviso April 2019 2
## 685 Gdansk Dublin April 2019 2
## 686 Santorini Athens April 2019 1
## 687 Dublin Gatwick April 2019 1
## 688 Santorini Athens April 2019 2
## 689 London Luton Athens April 2019 1
## 690 Gothenburg London April 2019 1
## 691 Gatwick Dublin April 2019 1
## 692 Chania Brussels Charleroi April 2019 1
## 693 Dublin Malaga April 2019 1
## 694 Stansted Rome April 2019 2
## 695 Munich Palma de Mallorca April 2019 2
## 696 Manchester Barcelona April 2019 1
## 697 Barcelona Porto April 2019 1
## 698 Palma de Mallorca Bristol April 2019 1
## 699 Southend Milan April 2019 3
## 700 Liverpool Dublin April 2019 1
## 701 Madrid Manchester April 2019 3
## 702 Manchester Madrid April 2019 1
## 703 Dublin Stansted April 2019 1
## 704 Barcelona Porto April 2019 2
## 705 Prague Edinburgh April 2019 1
## 706 Manchester Rome-Ciampino April 2019 1
## 707 Malaga Stockholm April 2019 1
## 708 East Midlands Dublin April 2019 4
## 709 Cologne Stansted April 2019 2
## 710 Berlin Milan April 2019 1
## 711 East Midlands Dublin April 2019 5
## 712 Faro Birmingham April 2019 2
## 713 Milano Hamburg April 2019 1
## 714 Malta Stansted March 2019 1
## 715 Berlin Riga October 2018 3
## 716 Bucharest Stansted March 2019 2
## 717 Luton Corfu August 2018 1
## 718 Prestwick Tenerife March 2019 4
## 719 Bologna Stansted March 2019 4
## 720 Prague Madrid March 2019 2
## 721 Cork Luton March 2019 5
## 722 London Stansted Luxembourg March 2019 1
## 723 Bucharest Bergamo March 2019 5
## 724 Tenerife Bristol March 2019 2
## 725 Barcelona Birmingham March 2019 1
## 726 Alicante Brussels March 2019 1
## 727 Manchester Madrid March 2019 3
## 728 Dublin Faro February 2019 4
## 729 Stansted Vienna March 2019 4
## 730 Krakow Manchester February 2019 4
## 731 Stansted Lanzarote February 2019 5
## 732 Amman Paphos February 2019 5
## 733 Dusseldorf Marrakesh February 2019 4
## 734 Warsaw Belfast February 2019 1
## 735 Bremen Tampere September 2018 2
## 736 Prague Ovda February 2019 4
## 737 Palma de Mallorca Barcelona February 2019 4
## 738 Barcelona Palma de Mallorca February 2019 4
## 739 Palermo Milan February 2019 2
## 740 Stansted Rabat January 2019 2
## 741 Athens Berlin February 2019 3
## 742 Paris Beauvais Prague February 2019 3
## 743 Athens Thessaloniki January 2019 2
## 744 Stansted Copenhagen February 2019 1
## 745 Lisbon Frankfurt February 2019 1
## 746 Manchester Lanzarote February 2019 2
## 747 Edinburgh Stansted October 2018 3
## 748 Manchester Madrid January 2019 1
## 749 Palma de Mallorca Madrid January 2019 3
## 750 Barcelona Palma de Mallorca January 2019 3
## 751 Malaga Stansted January 2019 1
## 752 Ibiza Barcelone October 2018 1
## 753 Prestwick Tenerife January 2019 2
## 754 London Stansted Stockholm-Skavsta January 2019 3
## 755 Barcelona Seville January 2019 3
## 756 Prague Barcelona January 2019 1
## 757 Thessaloniki Bologna January 2019 1
## 758 Bordeaux Stansted January 2019 1
## 759 Rome Brindisi December 2018 1
## 760 Frankfurt Krakow December 2018 2
## 761 Luton Malta December 2018 1
## 762 Luton Marrakesh December 2018 1
## 763 Madrid Stansted December 2018 2
## 764 Poznan Stansted August 2018 1
## 765 London Turin December 2018 1
## 766 Copenhagen Bologna November 2018 1
## 767 Stansted Shannon December 2018 3
## 768 Athens Thessaloniki December 2018 1
## 769 Bucharest Paphos December 2018 2
## 770 Tenerife Madrid December 2018 1
## 771 Stockholm Milan December 2018 1
## 772 Dublin Edinburgh November 2018 2
## 773 Stansted Lisbon December 2018 1
## 774 Leeds Krakow December 2018 2
## 775 Barcelona Dublin December 2018 1
## 776 Weeze Faro December 2018 2
## 777 Stansted Belfast December 2018 2
## 778 Luton Malta December 2018 3
## 779 Treviso Budapest December 2018 3
## 780 East Midlands Dublin December 2018 1
## 781 Luton Dublin November 2018 5
## 782 Bologna Catania October 2018 1
## 783 Stansted Frankfurt November 2018 2
## 784 Paris Beauvais Budapest September 2018 2
## 785 Kiev Warsaw November 2018 1
## 786 Malaga Prestwick November 2018 1
## 787 Barcelona Porto November 2018 2
## 788 Cologne Rome November 2018 2
## 789 Rome Athens November 2018 2
## 790 Dublin Krakow November 2018 3
## 791 Pisa Stansted November 2018 3
## 792 Naples London October 2018 1
## 793 Palermo Bucharest October 2018 2
## 794 Faro Bristol October 2018 3
## 795 Cologne Bristol May 2018 1
## 796 Athens Frankfurt October 2018 5
## 797 Luton Knock October 2018 3
## 798 Frankfurt Lisbon October 2018 3
## 799 Madrid Marrakesh October 2018 1
## 800 Frankfurt Lisbon October 2018 4
## 801 Copenhagen Dublin October 2018 2
## 802 Eindhoven Barcelona Reus October 2018 1
## 803 Stansted Porto October 2018 1
## 804 Santorini Athens May 2018 1
## 805 Budapest Nuremberg October 2018 1
## 806 Barcelona Cologne October 2018 1
## 807 Bournemouth Krakow October 2018 1
## 808 Ancona Stansted August 2018 1
## 809 Amsterdam Malaga October 2018 1
## 810 Athens Santorini October 2018 1
## 811 Prague Brussels October 2018 1
## 812 Dublin Bologna October 2018 4
## 813 Athens Thessaloniki October 2018 1
## 814 Rome Dublin September 2018 1
## 815 Dublin Gatwick October 2018 2
## 816 Rome Barcelona September 2018 3
## 817 Dublin Stansted October 2018 1
## 818 Paris Rome September 2018 2
## 819 Faro Dusseldorf September 2018 3
## 820 Seville Stansted September 2018 2
## 821 Sofia Madrid September 2018 1
## 822 Athens Heraklion September 2018 1
## 823 Corfu Stansted September 2018 1
## 824 Thessaloniki Paphos September 2018 2
## 825 Malaga Dublin September 2018 1
## 826 Stansted Eindhoven September 2018 1
## 827 Lisbon Ponta Delgada September 2018 2
## 828 East Midlands Warsaw September 2018 2
## 829 Frankfurt Corfu September 2018 1
## 830 Stansted Shannon September 2018 4
## 831 Budapest East Midlands September 2018 1
## 832 Athens Berlin September 2018 1
## 833 Barcelona Malaga August 2018 1
## 834 Stansted Rome September 2018 1
## 835 Stansted Brindisi August 2018 1
## 836 Milan Sofia May 2018 3
## 837 Santiago de Compostela Barcelona August 2018 2
## 838 Bratislava Gerona August 2018 3
## 839 Stansted Kefalonia August 2018 1
## 840 Stansted Corfu August 2018 1
## 841 Ibiza Liverpool August 2018 1
## 842 Dortmund Stansted August 2018 4
## 843 Thessaloniki Budapest August 2018 4
## 844 Bremen Palma de Mallorca July 2018 2
## 845 Athens Rome November 2017 4
## 846 Warsaw Barcelona August 2018 1
## 847 Stansted Oslo August 2018 1
## 848 Bristol Cologne August 2018 1
## 849 Naples Stansted August 2018 1
## 850 Cologne Berlin-Schonefeld August 2018 2
## 851 Stansted Athens July 2018 1
## 852 Berlin Glasgow August 2018 4
## 853 Budapest London Stansted August 2018 1
## 854 Bratislava London Stansted August 2018 3
## 855 Stansted Toulouse August 2018 1
## 856 Rome Comiso June 2018 1
## 857 Bucharest Stansted March 2018 1
## 858 Stansted Pardubice July 2018 2
## 859 Stansted Milan Bergamo August 2018 2
## 860 Athens Bratislava July 2018 1
## 861 Bucharest Rome August 2018 1
## 862 Rome Stansted July 2018 1
## 863 Cologne Berlin July 2018 1
## 864 Stansted Cologne July 2018 1
## 865 Toulouse Stansted July 2018 1
## 866 Ibiza Liverpool July 2018 1
## 867 DUB Pisa July 2018 4
## 868 Thessaloniki Stansted July 2018 3
## 869 Rome Athens July 2018 2
## 870 Paphos Stansted July 2018 2
## 871 Palma Barcelona July 2018 1
## 872 Stansted Pisa July 2018 1
## 873 Stansted Faro July 2018 1
## 874 London Milan July 2018 3
## 875 Cologne Bonn Copenhagen July 2018 1
## 876 Paphos Stansted July 2018 1
## 877 Pisa Stansted July 2018 1
## 878 Bologna Stansted July 2018 2
## 879 Venice Frankfurt July 2018 1
## 880 Athens Stansted April 2018 1
## 881 Copenhagen Naples July 2018 1
## 882 Pisa Stansted July 2018 1
## 883 Palma Stansted July 2018 1
## 884 Thessaloniki Stansted July 2018 1
## 885 Hamburg Edinburgh July 2018 1
## 886 Barcelona Dublin June 2018 1
## 887 Rome Ciampino Stansted July 2018 1
## 888 Bari Bologna July 2018 1
## 889 Palermo Stansted July 2018 1
## 890 Brussels Rome July 2018 4
## 891 Prague Bucharest July 2018 2
## 892 Athens Rome July 2018 1
## 893 Dublin Budapest June 2018 2
## 894 Thessaloniki Stansted July 2018 1
## 895 London Barcelona July 2018 1
## 896 Lamezia Terme London June 2018 1
## 897 Stansted Frankfurt May 2018 1
## 898 Edinburgh Prague June 2018 2
## 899 East Midlands Las Palmas June 2018 4
## 900 Skavsta Stanford July 2018 4
## 901 Stansted Cork May 2018 2
## 902 Stansted Nuremberg June 2018 4
## 903 Barcelona Venice June 2018 3
## 904 Alicante Newcastle-upon-Tyne June 2018 2
## 905 Malta Sevilla June 2018 1
## 906 Edinburgh Stansted June 2018 1
## 907 Barcelona Berlin June 2018 1
## 908 Cologne Manchester June 2018 5
## 909 Manchester Cologne June 2018 5
## 910 Venice Barcelona June 2018 2
## 911 Berlin TXL Palma de Mallorca June 2018 3
## 912 Weeze Alicante May 2018 2
## 913 Lisbon Toulouse June 2018 3
## 914 Rome Paris June 2018 2
## 915 Bergamo Marrakech June 2018 2
## 916 Brussels Rome June 2018 2
## 917 Palma Dublin July 2017 1
## 918 Berlin Thessaloniki June 2018 1
## 919 Manchester Naples April 2018 3
## 920 Milan Bergamo Barcelona June 2018 1
## 921 Dublin Lanzarote July 2017 4
## 922 Glasgow Berlin May 2018 1
## 923 Milano Malpensa Oporto June 2018 2
## 924 Barcelona London Stansted June 2018 1
## 925 Oslo Stansted June 2018 1
## 926 Madrid Sofia June 2018 2
## 927 Palma de Mallorca Stansted June 2018 2
## 928 Venice Stansted June 2018 1
## 929 Alicante East Midlands June 2018 4
## 930 Girona Pisa June 2018 1
## 931 Majorca Liverpool May 2018 2
## 932 Gatwick Dublin May 2018 1
## 933 Knock Bristol June 2018 1
## 934 Leeds Bratislava June 2018 1
## 935 Bologna Stansted May 2018 1
## 936 Shannon Stansted May 2018 1
## 937 Berlin Stansted May 2018 2
## 938 Edinburgh Stansted June 2017 1
## 939 Munich Dublin May 2018 2
## 940 Seville Cologne May 2018 1
## 941 Madrid Dublin May 2018 1
## 942 Stansted Frankfurt May 2018 1
## 943 Budapest Charleroi May 2018 1
## 944 Dublin Brussels May 2018 2
## 945 Mykonos Athens May 2018 2
## 946 Brussels Dublin May 2018 3
## 947 Milan Valencia May 2018 3
## 948 Manchester Palma May 2018 1
## 949 Ponta Delgada Porto March 2018 3
## 950 Porto Ponta Delgada March 2018 3
## 951 Bristol Malta May 2018 4
## 952 Milan Stansted May 2018 1
## 953 Sofia Stansted May 2018 1
## 954 Athens Dublin May 2018 2
## 955 Budapest Copenhagen April 2018 2
## 956 Stansted Dublin March 2018 3
## 957 Stansted Athens April 2018 5
## 958 Leeds Bradford Corfu April 2018 1
## 959 Bristol Faro April 2018 3
## 960 Faro Bristol April 2018 4
## 961 Lisbon Ponta Delgada April 2018 2
## 962 Rome Ciampino Tarbes April 2018 4
## 963 Jerez Barcelona March 2018 1
## 964 Barcelona Milan April 2018 2
## 965 Lublin Stansted April 2018 1
## 966 Malta Stansted April 2018 1
## 967 Dinard London Stansted April 2018 4
## 968 Manchester Nuremberg April 2018 2
## 969 Zadar Stansted March 2018 1
## 970 Rome Athens April 2018 1
## 971 Riga Bremen March 2018 4
## 972 Toulouse Frankfurt March 2018 1
## 973 Rome Tel Aviv April 2018 1
## 974 Malaga London April 2018 3
## 975 Athens Thessaloniki February 2018 2
## 976 Edinburgh Brussels March 2018 1
## 977 Toulouse Stansted January 2018 2
## 978 London Stansted La Rochelle March 2018 1
## 979 Bratislava Bologna March 2018 2
## 980 Milan Manchester January 2018 2
## 981 Athens Stansted August 2017 2
## 982 Rome Barcelona March 2018 1
## 983 Madrid Stansted March 2018 2
## 984 London Stansted Lisbon March 2018 1
## 985 Dublin Rome Ciampino March 2018 4
## 986 Birmingham Malaga December 2017 2
## 987 Frankfurt London Stansted March 2018 1
## 988 London Stansted Karlsruhe March 2018 3
## 989 Manchester Barcelona November 2017 3
## 990 Dublin Gran Canaria February 2018 4
## 991 Dublin Fuerteventura March 2018 2
## 992 Dublin Glasgow February 2018 3
## 993 Leeds Alicante February 2018 3
## 994 Glasgow Frankfurt February 2018 3
## 995 Tallinn London Stansted February 2018 1
## 996 Madrid Berlin February 2018 3
## 997 London Gatwick Dublin February 2018 5
## 998 London Stansted Grenoble February 2018 3
## 999 Budapest Dublin February 2018 5
## 1000 London Stansted Cork February 2018 2
## 1001 Cologne Dublin February 2018 3
## 1002 Thessaloniki Rome February 2018 1
## 1003 Manchester Budapest February 2018 1
## 1004 Gran Canaria Bristol February 2018 2
## 1005 Athens Frankfurt January 2018 4
## 1006 Frankfurt Athens January 2018 4
## 1007 Rome Palermo January 2018 1
## 1008 Rome Tel Aviv February 2018 4
## 1009 Manchester Lisbon January 2018 3
## 1010 Athens Dublin January 2018 1
## 1011 Madrid Marrakesh January 2018 1
## 1012 Oslo London Stansted January 2018 1
## 1013 Glasgow Berlin January 2018 4
## 1014 Berlin Bucharest November 2017 1
## 1015 Madrid Birmingham December 2017 3
## 1016 Gdansk Stansted January 2018 1
## 1017 Las Palmas Madrid November 2017 1
## 1018 Dublin Kaunas January 2018 1
## 1019 Barcelona Venice January 2018 4
## 1020 Leeds Faro November 2017 1
## 1021 Edinburgh Rome January 2018 2
## 1022 Zaragoza Stansted January 2018 3
## 1023 Manchester Malaga January 2018 3
## 1024 Stansted Brindisi January 2018 1
## 1025 Glasgow Dublin January 2018 1
## 1026 Malta Rome December 2017 5
## 1027 Malaga Newcastle January 2018 2
## 1028 East Midlands Berlin December 2017 3
## 1029 Ponta Delgada Porto December 2017 3
## 1030 Milan Catania December 2017 3
## 1031 Barcelona Frankfurt December 2017 2
## 1032 Porto Milan December 2017 1
## 1033 Stansted Berlin December 2017 1
## 1034 Tel Aviv Paphos December 2017 2
## 1035 Milan Madrid December 2017 3
## 1036 Prague Stansted September 2017 2
## 1037 Lanzarote Berlin December 2017 2
## 1038 Podgorica Stockholm December 2017 3
## 1039 Athens Malta December 2017 1
## 1040 Palma Barcelona December 2017 2
## 1041 Liverpool Barcelona December 2017 1
## 1042 Barcelona Cologne Bonn December 2017 1
## 1043 Birmingham Verona November 2017 1
## 1044 Hamburg Lisbon December 2017 1
## 1045 Athens Frankfurt December 2017 2
## 1046 Budapest Stansted December 2017 1
## 1047 Malaga Amsterdam December 2017 1
## 1048 Barcelona Tenerife November 2017 2
## 1049 Rome Athens November 2017 2
## 1050 Porto Stansted July 2017 1
## 1051 Budapest Dublin November 2017 3
## 1052 Copenhagen Stansted November 2017 2
## 1053 Stansted Limoges September 2017 2
## 1054 Gatwick Dublin November 2017 5
## 1055 Stansted Dublin November 2017 2
## 1056 Tel Aviv Rome November 2017 2
## 1057 London Stansted Barcelona November 2017 1
## 1058 Dublin Bologna October 2017 4
## 1059 Naples Thessaloniki November 2017 3
## 1060 Stansted Dublin November 2017 4
## 1061 Faro Bristol November 2017 1
## 1062 London Prague November 2017 2
## 1063 East Midlands Dublin November 2017 1
## 1064 London Stansted Carcassonne November 2017 4
## 1065 Shannon Stansted October 2017 4
## 1066 Roma Madrid October 2017 1
## 1067 Palermo Stansted October 2017 1
## 1068 Bristol Palma October 2017 1
## 1069 Glasgow Lisbon October 2017 1
## 1070 Stansted Bucharest October 2017 1
## 1071 Gatwick Belfast October 2017 1
## 1072 Alicante Kaunas October 2017 4
## 1073 Stansted Hamburg October 2017 1
## 1074 Stansted Dublin October 2017 3
## 1075 Barcelona Rome October 2017 4
## 1076 Glasgow Sofia July 2017 2
## 1077 Dublin Stansted October 2017 1
## 1078 Manchester Alicante October 2017 2
## 1079 Stanstead Zadar October 2017 1
## 1080 Manchester Palma October 2017 2
## 1081 Liverpool Dublin October 2017 4
## 1082 London Bucharest October 2017 3
## 1083 East Midlands Bergerac October 2017 4
## 1084 Paris Porto October 2017 1
## 1085 Ibiza Malaga July 2017 1
## 1086 Liverpool Prague September 2017 2
## 1087 Edinburgh Faro October 2017 3
## 1088 Venice Eindhoven September 2017 5
## 1089 Glasgow Dublin September 2017 2
## 1090 Rome Krakow September 2017 1
## 1091 Palma Bournemouth September 2017 4
## 1092 Hamburg Manchester September 2017 1
## 1093 Pisa Brindisi August 2017 2
## 1094 Corfu Stansted September 2017 2
## 1095 Stansted Riga September 2017 1
## 1096 Edinburgh Stansted September 2017 1
## 1097 Cologne Bonn Rome Ciampino September 2017 2
## 1098 Dublin Amsterdam August 2017 3
## 1099 Manchester Fuerteventura September 2017 1
## 1100 Gdansk Bristol September 2017 1
## 1101 Rome Budapest September 2017 1
## 1102 Dublin Manchester August 2017 5
## 1103 Liverpool Barcelona August 2017 4
## 1104 Faro East Midlands August 2017 1
## 1105 Knock Stanstead August 2017 2
## 1106 Stanstead Agadir August 2017 3
## 1107 Malaga Stansted August 2017 1
## 1108 Luton Dublin August 2017 1
## 1109 Dublin Budapest August 2017 1
## 1110 Naples Manchester August 2017 1
## 1111 London Stansted Cologne August 2017 2
## 1112 Catania Milano August 2017 3
## 1113 Wroclaw Warsaw August 2017 3
## 1114 Dublin Rome March 2017 4
## 1115 Naples Barcelona August 2017 1
## 1116 London Stansted Sofia August 2017 4
## 1117 Madrid Toulouse August 2017 2
## 1118 Manchester Madrid August 2017 4
## 1119 Birmingham Malaga August 2017 1
## 1120 Madrid Rome Ciampino July 2017 4
## 1121 Stansted Rome July 2017 1
## 1122 Dublin Paris Beauvais July 2017 3
## 1123 Timisoara Stansted July 2017 1
## 1124 Girona Stansted July 2017 2
## 1125 Stockholm Rome July 2017 1
## 1126 Sofia Stansted July 2017 2
## 1127 Dublin London Luton July 2017 2
## 1128 Palma Majorca Barcelona July 2017 1
## 1129 Memmingen Dublin July 2017 5
## 1130 Berlin Stansted July 2017 2
## 1131 Beauvais, France Lisbon, Portugal June 2017 3
## 1132 Berlin Rome July 2017 2
## 1133 Santorini Athens July 2017 1
## 1134 Athens Stansted July 2017 4
## 1135 Dublin Glasgow April 2017 3
## 1136 Edinburgh Dublin July 2017 1
## 1137 Rome Stansted July 2017 2
## 1138 Manchester Alicante July 2017 2
## 1139 Manchester Rome May 2017 1
## 1140 Corfu Birmingham June 2017 3
## 1141 Warsaw Modlin Brussels CRL June 2017 5
## 1142 Palermo Dublin June 2017 1
## 1143 Manchester Milan Bergamo June 2017 2
## 1144 London Stansted Edinburgh June 2017 1
## 1145 Poitiers Stansted June 2017 1
## 1146 Edinburgh Vigo June 2017 2
## 1147 Mykonos Athens June 2017 2
## 1148 London Krakow June 2017 1
## 1149 Bristol Malaga June 2017 1
## 1150 Stansted Athens June 2017 2
## 1151 London Stansted Rzeszow March 2017 1
## 1152 Cologne-Bonn Berlin May 2017 3
## 1153 Stansted Poitiers June 2017 2
## 1154 Stansted Valencia June 2017 1
## 1155 Murcia Luton June 2017 1
## 1156 Eindhoven Lisbon June 2017 1
## 1157 Stansted Athens May 2017 1
## 1158 Murcia East Midlands May 2017 2
## 1159 Faro Dublin May 2017 3
## 1160 Bologna Bucharest March 2017 4
## 1161 Leeds Bradford Palma April 2017 3
## 1162 Stansted Rome May 2017 2
## 1163 Edinburgh Barcelona May 2017 2
## 1164 Stansted Cork May 2017 3
## 1165 Carcassonne Manchester May 2017 3
## 1166 Carcassonne Manchester May 2017 3
## 1167 Stansted Rome May 2017 3
## 1168 Bucharest Timisoara May 2017 1
## 1169 Kerry Frankfurt Hahn April 2017 3
## 1170 Stansted Fez April 2017 1
## 1171 Frankfurt Hahn Kerry April 2017 4
## 1172 Bristol Dublin August 2016 2
## 1173 Dublin Copenhagen April 2017 1
## 1174 Gatwick Belfast March 2017 3
## 1175 Dublin Manchester March 2017 1
## 1176 London Cologne January 2017 3
## 1177 Santorini Athens March 2017 3
## 1178 Glasgow Prestwick Lanzarote February 2017 3
## 1179 Manchester Dublin February 2017 3
## 1180 Ponta Delgada Lisbon February 2017 3
## 1181 Lisbon Ponta Delgada February 2017 3
## 1182 Liverpool Alicante February 2017 3
## 1183 Dublin Amsterdam February 2017 3
## 1184 Athens Sofia February 2017 4
## 1185 Faro London Stansted February 2017 3
## 1186 OPO BCN February 2017 5
## 1187 Edinburgh Barcelona February 2017 4
## 1188 Athens Thessaloniki February 2017 2
## 1189 Dublin Leeds February 2017 4
## 1190 Ponta Delgada Lisbon February 2017 4
## 1191 Lisbon Ponta Delgada February 2017 1
## 1192 Birmingham Malta February 2017 2
## 1193 Bournemouth Malta January 2017 4
## 1194 Knock Liverpool January 2017 4
## 1195 ATH SXF January 2017 1
## 1196 BCN DUB January 2017 3
## 1197 FAO EDI January 2017 1
## 1198 DUB BUD January 2017 1
## 1199 TFS STN January 2017 1
## 1200 EDI FAO January 2017 2
## 1201 FAO BRS December 2016 4
## 1202 MAN SXF December 2016 2
## 1203 DUB LGW December 2016 4
## 1204 AGP PMI December 2016 2
## 1205 STN SXF December 2016 5
## 1206 DUB CPH December 2016 1
## 1207 LTN CPH November 2016 3
## 1208 CPH LTN November 2016 5
## 1209 BUD MAN December 2016 1
## 1210 BVA TSF May 2016 3
## 1211 GLA STN December 2016 3
## 1212 MAN AGP November 2016 2
## 1213 STN POZ September 2016 2
## 1214 BCN FCO November 2016 4
## 1215 STN SNN November 2016 2
## 1216 SXF VNO November 2016 4
## 1217 LIS PDL November 2016 3
## 1218 CIA LIS November 2016 3
## 1219 BFS ACE November 2016 4
## 1220 LIS CIA November 2016 3
## 1221 PDL LIS November 2016 2
## 1222 STN FCO October 2016 4
## 1223 MAN AGP November 2016 3
## 1224 BUD SXF November 2016 2
## 1225 CIA LIS November 2016 4
## 1226 OPO MXP November 2016 4
## 1227 LIS OPO November 2016 4
## 1228 STN CIA November 2016 2
## 1229 DUB LGW November 2016 4
## 1230 STN TSF November 2016 5
## 1231 RAK SVQ September 2016 4
## 1232 SXF VNO October 2016 3
## 1233 CPH EDI October 2016 1
## 1234 ALC EMA October 2016 5
## 1235 BRE NYO October 2016 3
## 1236 STN TLL October 2016 2
## 1237 BRS PMI October 2016 1
## 1238 STN FAO October 2016 4
## 1239 EGC STN October 2016 1
## 1240 FAO STN October 2016 5
## 1241 DUB BRS September 2016 2
## 1242 CRL FUE October 2016 3
## 1243 MAN MAD October 2016 1
## 1244 IBZ BLQ October 2016 1
## 1245 BGY OPO September 2016 2
## 1246 EDI SDR October 2016 3
## 1247 DUB AMS October 2016 2
## 1248 ACE BRS October 2016 4
## 1249 SXF BTS September 2016 3
## 1250 EMA TFS October 2016 1
## 1251 BTS SXF July 2016 3
## 1252 MAD OPO September 2016 3
## 1253 BLQ CRL August 2016 2
## 1254 MJV LTN September 2016 3
## 1255 LTN MJV September 2016 2
## 1256 SXF CGN September 2016 5
## 1257 CRK STN September 2016 2
## 1258 OPO BCN September 2016 1
## 1259 PIK MJV September 2016 1
## 1260 BRS FAO August 2016 2
## 1261 ORK ACE September 2016 1
## 1262 MAN BCN August 2016 2
## 1263 STN VRN September 2016 3
## 1264 SNN AGP September 2016 3
## 1265 PMI EMA September 2016 3
## 1266 AGP STN September 2016 3
## 1267 STN NYO May 2016 3
## 1268 STN MXP April 2016 3
## 1269 STN NUE August 2016 3
## 1270 LPL FNI August 2016 3
## 1271 PIK MJV August 2016 4
## 1272 FUE PIK August 2016 2
## 1273 SKG STN August 2016 1
## 1274 SKG FKB August 2016 3
## 1275 NUE STN June 2016 3
## 1276 LPL FAO August 2016 1
## 1277 BRS KUN August 2016 3
## 1278 MAN ALC July 2016 4
## 1279 PRG STN June 2016 4
## 1280 DUB AGP June 2016 3
## 1281 MAN BVA July 2016 4
## 1282 ATH JMK July 2016 1
## 1283 BCN FCO July 2016 1
## 1284 BFS LGW July 2016 3
## 1285 EDI FAO July 2016 1
## 1286 STN OTP July 2016 3
## 1287 BOH MLA June 2016 4
## 1288 BRU SXF May 2016 3
## 1289 STN CGN May 2016 4
## 1290 MAN BCN July 2016 1
## 1291 LIS MAN June 2016 4
## 1292 LTN LPA July 2016 1
## 1293 DUB LGW June 2016 1
## 1294 PIK ACE June 2016 3
## 1295 SNN LGW June 2016 1
## 1296 LTN CPH June 2016 1
## 1297 STN LIS June 2016 4
## 1298 LPL AGP June 2016 3
## 1299 BRS DUB June 2016 2
## 1300 PIK ALC May 2016 4
## 1301 MAD OPO May 2016 4
## 1302 STN WRO November 2015 3
## 1303 DUB MAN June 2016 5
## 1304 STN CIA May 2016 3
## 1305 FAO STN May 2016 3
## 1306 PMI LPL April 2016 4
## 1307 SXF EMA May 2016 2
## 1308 EMA LIG June 2015 3
## 1309 EMA MJV February 2016 2
## 1310 AGP MAN May 2016 2
## 1311 LBA FUE May 2016 4
## 1312 MAN BTS May 2016 2
## 1313 MAD STN May 2016 4
## 1314 STN GOT May 2016 3
## 1315 CRL PUY May 2016 2
## 1316 DUB AGP April 2016 3
## 1317 LGW BFS April 2016 5
## 1318 GRO STN April 2016 3
## 1319 LTN MLA April 2016 3
## 1320 ATH SKG April 2016 3
## 1321 GLA DUB April 2016 3
## 1322 SVQ DUB April 2016 1
## 1323 ALC BHX March 2016 1
## 1324 ORK AGP March 2016 2
## 1325 CPH LTN March 2016 5
## 1326 DUB SXF March 2016 3
## 1327 EDI BRU February 2016 1
## 1328 BHX DUB March 2016 4
## 1329 PRG STN March 2016 3
## 1330 BTS STN March 2016 2
## 1331 NUE STN March 2016 2
## 1332 LIS HAM March 2016 4
## 1333 BCN STN March 2016 3
## 1334 CGN WAW March 2016 2
## 1335 ORK STN March 2016 2
## 1336 MAD PMO September 2015 2
## 1337 CRL SDR March 2016 2
## 1338 EMA DUB March 2016 3
## 1339 BRU BCN February 2016 1
## 1340 TSF TFS February 2016 4
## 1341 LTN ACE February 2016 5
## 1342 DUB LBA February 2016 4
## 1343 ATH JTR February 2016 5
## 1344 EDI BCN September 2015 2
## 1345 FEZ STN February 2016 4
## 1346 STN FEZ February 2016 5
## 1347 BLL PMI July 2015 3
## 1348 CRL AGP February 2016 2
## 1349 EMA AGP February 2016 3
## 1350 MAN DUB February 2016 3
## 1351 RAK SVQ February 2016 3
## 1352 Leeds Arrecife January 2016 3
## 1353 ACE LBA January 2016 3
## 1354 ALC EDI January 2016 2
## 1355 BHX DUB January 2016 3
## 1356 MAN CIA January 2016 2
## 1357 AMS DUB January 2016 4
## 1358 LTN MLA January 2016 1
## 1359 DUB LGW January 2016 3
## 1360 BHX TFS January 2016 2
## 1361 BCN TSF January 2016 4
## 1362 CPH DUB January 2016 3
## 1363 FCO BCN January 2016 1
## 1364 XRY BCN January 2016 3
## 1365 LIS MAN January 2016 2
## 1366 LPA MAN December 2015 3
## 1367 MAN FAO December 2015 3
## 1368 DUB LGW January 2016 1
## 1369 LTN ACE January 2016 1
## 1370 MAD TNG December 2015 2
## 1371 BHX ACE December 2015 1
## 1372 MAN AGP December 2015 1
## 1373 CRL MAN December 2015 3
## 1374 NRN RHO December 2015 2
## 1375 CPH KUN December 2015 1
## 1376 Birmingham Tenerife South December 2015 1
## 1377 London Kaunas December 2015 1
## 1378 BGY ZAZ December 2015 2
## 1379 Dublin Malaga December 2015 2
## 1380 Stansted Malaga December 2015 1
## 1381 Bologna Madrid March 2015 2
## 1382 Dublin Bristol December 2015 1
## 1383 Liverpool Limoges December 2015 4
## 1384 Amsterdam Dublin December 2015 3
## 1385 Edinburgh Brussels December 2015 2
## 1386 Dublin Malta December 2015 1
## 1387 Manchester Dublin December 2015 3
## 1388 Dublin London Gatwick December 2015 1
## 1389 Birmingham Arrecife November 2015 2
## 1390 London Barcelona December 2015 1
## 1391 Vilnius Milan December 2015 2
## 1392 Dublin Liverpool December 2015 1
## 1393 Fuerteventura Birmingham December 2015 2
## 1394 Warsaw Madrid February 2015 1
## 1395 CPH CRL December 2015 2
## 1396 AC MAN November 2015 3
## 1397 Limoges E.Midlands November 2015 3
## 1398 Berlin Barcelona November 2015 4
## 1399 Stansted Lisbon November 2015 1
## 1400 Stansted Treviso November 2015 2
## 1401 Stansted Gothenburg November 2015 5
## 1402 Malaga Liverpool November 2015 3
## 1403 Stansted Lisbon November 2015 5
## 1404 Tenerife Stansted November 2015 1
## 1405 ATH STN March 2015 3
## 1406 Manchester Beziers November 2015 5
## 1407 PIK LPA October 2015 3
## 1408 BCN LPA October 2015 4
## 1409 Glasgow Palma September 2015 5
## 1410 Pula Brussel October 2015 4
## 1411 Bristol Dublin September 2015 3
## 1412 Frankfurt Valencia April 2015 1
## 1413 BRU FCO July 2015 2
## 1414 Barcelona Dublin November 2015 4
## 1415 Stansted Jerez October 2015 1
## 1416 Athens Chania November 2015 1
## 1417 London Athens October 2015 3
## 1418 Brussels Manchester October 2015 3
## 1419 Bucharest Otopeni Rome Ciampino October 2015 4
## 1420 Pisa London September 2015 1
## 1421 Eindhoven Dublin October 2015 2
## 1422 Rodez London Stansted April 2015 4
## 1423 Bari Trieste October 2015 2
## 1424 HHN SDR October 2015 2
## 1425 Ancona Falconara London Stansted June 2015 3
## 1426 Stansted Dublin October 2015 1
## 1427 Edinburgh Stansted October 2015 3
## 1428 STN PSA October 2015 2
## 1429 Gatwick Marseille October 2015 3
## 1430 LGW DUB October 2015 2
## 1431 London Denmark October 2015 3
## 1432 Alicante Edinburgh October 2015 3
## 1433 STN FMM October 2015 5
## 1434 Athens Chania September 2015 1
## 1435 Las Palmas Luton October 2015 4
## 1436 Bournemouth Gerona October 2015 5
## 1437 Stansted Marseille October 2015 2
## 1438 Manchester Corfu October 2015 2
## 1439 Porto Faro September 2015 1
## 1440 Manchester Milan August 2015 1
## 1441 Bournemouth Palma October 2015 3
## 1442 PMI HHN October 2015 5
## 1443 Madrid Stansted October 2015 1
## 1444 Malta East Midlands October 2015 1
## 1445 Limoges Bristol September 2015 4
## 1446 Dinard London September 2015 1
## 1447 Athens Rome Ciampino October 2015 1
## 1448 Arrecife Birmingham October 2015 4
## 1449 Dublin Santander September 2015 3
## 1450 Brussels Charleroi Warsaw Modlin September 2015 4
## 1451 Dublin Wroclaw October 2015 4
## 1452 Birmingham Dublin September 2015 1
## 1453 Eindhoven London September 2015 1
## 1454 Stansted Krakow October 2015 4
## 1455 Dublin Bristol August 2015 1
## 1456 PMI MAD September 2015 3
## 1457 Bati Rome October 2015 3
## 1458 London Dublin October 2015 2
## 1459 Stansted Zaragoza October 2015 2
## 1460 Edinburgh Dublin September 2015 4
## 1461 PRG BRE August 2015 1
## 1462 Jerez Stansted October 2015 4
## 1463 Stansted Budapest September 2015 1
## 1464 Manchester Shannon September 2015 3
## 1465 Corfu Stansted September 2015 1
## 1466 Liverpool Malaga June 2015 1
## 1467 TFS PIK September 2015 3
## 1468 Palma East Midlands September 2015 4
## 1469 Malaga Leeds Bradford September 2015 3
## 1470 Liverpool Dublin September 2015 5
## 1471 Dublin Malaga September 2015 2
## 1472 BRS CHQ September 2015 1
## 1473 Madrid Stansted September 2015 3
## 1474 Liverpool Warsaw September 2015 2
## 1475 Stansted Glasgow September 2015 3
## 1476 Manchester Dublin September 2015 3
## 1477 Copenhagen Rome September 2015 1
## 1478 HHN OPO September 2015 1
## 1479 Liverpool Barcelona El Prat September 2015 4
## 1480 BCN OPO May 2015 1
## 1481 Valencia Bari September 2015 3
## 1482 Cologne Madrid September 2015 1
## 1483 Corfu Glasgow Prestwick September 2015 1
## 1484 Trieste Alghero August 2015 3
## 1485 East Midlands Fuerteventura September 2015 1
## 1486 Athens Santorini September 2015 2
## 1487 Madrid Stansted September 2015 4
## 1488 Birmingham Murcia September 2015 1
## 1489 Stansted Athens September 2015 3
## 1490 Lamezia Stansted September 2015 4
## 1491 Stansted Kos September 2015 1
## 1492 Stansted Lisbon November 2014 1
## 1493 Birmingham Dublin September 2015 1
## 1494 Stansted Jerez September 2015 1
## 1495 Stansted Billund May 2015 1
## 1496 Luton Lanzarote September 2015 2
## 1497 Barcelona Seville August 2015 2
## 1498 Athens Santorini August 2015 1
## 1499 Lisbon Stansted August 2015 1
## 1500 East Midlands Alicante August 2015 1
## 1501 Barcelona Mallorca September 2015 3
## 1502 Zadar Dublin August 2015 1
## 1503 Stansted Milan Bergamo July 2015 1
## 1504 Frankfurt-Hahn Fuerteventura July 2015 1
## 1505 Arrecife Luton August 2015 2
## 1506 Shannon Paris August 2015 1
## 1507 Stansted Barcelona August 2015 2
## 1508 Krakow Athens August 2015 2
## 1509 Palma Stansted August 2015 2
## 1510 Bournemouth Malta August 2015 3
## 1511 Malaga Manchester August 2015 1
## 1512 Prague Brussels August 2015 5
## 1513 Perugia/Pisa Brussels Charleroi August 2015 4
## 1514 Stockholm London May 2015 1
## 1515 Valencia Ibiza August 2015 2
## 1516 Bristol Malta August 2015 3
## 1517 Warsaw Marseille August 2015 3
## 1518 Manchester Ibiza August 2015 4
## 1519 Birmingham Palma August 2015 5
## 1520 Stanstead Chania August 2015 1
## 1521 Glasgow Prestwick Faro Portugal August 2015 4
## 1522 East Midlands Palma August 2015 4
## 1523 Leeds Bradford Malta June 2015 3
## 1524 Dublin Edinburgh August 2015 2
## 1525 Frankfurt-Hahn Rome Ciampino August 2015 4
## 1526 ALC EMA August 2015 1
## 1527 Malaga Bristol August 2015 1
## 1528 Treviso Eindhoven July 2015 3
## 1529 Edinburgh Bratislava August 2015 3
## 1530 Stansted Cyprus July 2015 1
## 1531 LGW Stockholm September 2014 2
## 1532 Stansted Haugesund May 2015 4
## 1533 East Midlands Chania July 2015 5
## 1534 MAN Stuttgart July 2015 3
## 1535 Roma Krakow August 2015 5
## 1536 Manchester Stuttgart August 2015 4
## 1537 Berlin London Stansted April 2015 4
## 1538 Edinburgh Palma July 2015 1
## 1539 Stansted Bari July 2015 3
## 1540 Santander Barcelona June 2015 5
## 1541 Liverpool Malaga July 2015 3
## 1542 Brussels Lisbon July 2015 2
## 1543 Dublin Marrakech June 2015 4
## 1544 Stansted Poznan July 2015 3
## 1545 FMM AHO July 2015 2
## 1546 Stansted, Uk Knock, Ireland July 2015 3
## 1547 London, Stansted Rzeszow, Jasionka July 2015 2
## 1548 BSL STN July 2015 4
## 1549 Billund Venice June 2015 2
## 1550 Edinburgh Gasglow July 2015 3
## 1551 Manchester Bologna Italy July 2015 1
## 1552 Warszawa Tenerife July 2015 5
## 1553 Trieste Valencia June 2015 3
## 1554 Rome Edinburgh July 2015 1
## 1555 HHN STN July 2015 3
## 1556 Stansted Malaga July 2015 3
## 1557 Prague London June 2015 1
## 1558 Pisa Frankfurt Hahn July 2015 5
## 1559 Glasgow Dublin June 2015 3
## 1560 London Dublin July 2015 1
## 1561 London Lourdes July 2015 1
## 1562 Brussels Dublin July 2015 2
## 1563 East Midlands Ibiza July 2015 3
## 1564 Stansted Morocco June 2015 3
## 1565 Bristol Malta June 2015 1
## 1566 London Gatwick Cork May 2015 4
## 1567 Santiago Madrid June 2015 1
## 1568 Liverpool Dublin June 2015 1
## 1569 Leeds Bradford Tenerife April 2015 2
## 1570 BRE EDI June 2015 5
## 1571 London Stansted Jerez June 2015 2
## 1572 ATH CRL February 2015 3
## 1573 AGP BRU June 2015 2
## 1574 Unknown Unknown Unknown 5
## 1575 Bergamo East Midlands June 2015 2
## 1576 Glasgow Bydgoszcz June 2015 3
## 1577 Warsaw Modlin London Stansted June 2015 3
## 1578 STN DUB Unknown 3
## 1579 STN CHP Unknown 3
## 1580 Stansted Bucharest Unknown 4
## 1581 Unknown Unknown Unknown 3
## 1582 Unknown Unknown Unknown 4
## 1583 Unknown Unknown Unknown 1
## 1584 Unknown Unknown Unknown 2
## 1585 Unknown Unknown Unknown 3
## 1586 Unknown Unknown Unknown 3
## 1587 Unknown Unknown Unknown 4
## 1588 Unknown Unknown Unknown 3
## 1589 Unknown Unknown Unknown 3
## 1590 Unknown Unknown Unknown 3
## 1591 Unknown Unknown Unknown 4
## 1592 Unknown Unknown Unknown 3
## 1593 Unknown Unknown Unknown 4
## 1594 Unknown Unknown Unknown 3
## 1595 Unknown Unknown Unknown 4
## 1596 Unknown Unknown Unknown 4
## 1597 Unknown Unknown Unknown 2
## 1598 Unknown Unknown Unknown 1
## 1599 Unknown Unknown Unknown 3
## 1600 Unknown Unknown Unknown 3
## 1601 Unknown Unknown Unknown 4
## 1602 Unknown Unknown Unknown 3
## 1603 Unknown Unknown Unknown 2
## 1604 Unknown Unknown Unknown 3
## 1605 Unknown Unknown Unknown 4
## 1606 Unknown Unknown Unknown 4
## 1607 Unknown Unknown Unknown 4
## 1608 Unknown Unknown Unknown 2
## 1609 Unknown Unknown Unknown 4
## 1610 Unknown Unknown Unknown 2
## 1611 Unknown Unknown Unknown 4
## 1612 Unknown Unknown Unknown 3
## 1613 Unknown Unknown Unknown 2
## 1614 Unknown Unknown Unknown 3
## 1615 Unknown Unknown Unknown 2
## 1616 Unknown Unknown Unknown 1
## 1617 Unknown Unknown Unknown 5
## 1618 Unknown Unknown Unknown 4
## 1619 Unknown Unknown Unknown 3
## 1620 Unknown Unknown Unknown 4
## 1621 Unknown Unknown Unknown 3
## 1622 Unknown Unknown Unknown 4
## 1623 Unknown Unknown Unknown 3
## 1624 Unknown Unknown Unknown 4
## 1625 Unknown Unknown Unknown 3
## 1626 Unknown Unknown Unknown 2
## 1627 Unknown Unknown Unknown 5
## 1628 Unknown Unknown Unknown 4
## 1629 Unknown Unknown Unknown 4
## 1630 Unknown Unknown Unknown 4
## 1631 Unknown Unknown Unknown 3
## 1632 Unknown Unknown Unknown 4
## 1633 Unknown Unknown Unknown 3
## 1634 Unknown Unknown Unknown 5
## 1635 Unknown Unknown Unknown 4
## 1636 Unknown Unknown Unknown 3
## 1637 Unknown Unknown Unknown 3
## 1638 Unknown Unknown Unknown 3
## 1639 Unknown Unknown Unknown 3
## 1640 Unknown Unknown Unknown 3
## 1641 Unknown Unknown Unknown 3
## 1642 Unknown Unknown Unknown 3
## 1643 Unknown Unknown Unknown 3
## 1644 Unknown Unknown Unknown 3
## 1645 Unknown Unknown Unknown 4
## 1646 Unknown Unknown Unknown 3
## 1647 Unknown Unknown Unknown 4
## 1648 Unknown Unknown Unknown 4
## 1649 Unknown Unknown Unknown 4
## 1650 Unknown Unknown Unknown 1
## 1651 Unknown Unknown Unknown 4
## 1652 Unknown Unknown Unknown 3
## 1653 Unknown Unknown Unknown 3
## 1654 Unknown Unknown Unknown 2
## 1655 Unknown Unknown Unknown 3
## 1656 Unknown Unknown Unknown 3
## 1657 Unknown Unknown Unknown 1
## 1658 Unknown Unknown Unknown 5
## 1659 Unknown Unknown Unknown 2
## 1660 Unknown Unknown Unknown 3
## 1661 Unknown Unknown Unknown 2
## 1662 Unknown Unknown Unknown 4
## 1663 Unknown Unknown Unknown 3
## 1664 Unknown Unknown Unknown 3
## 1665 Unknown Unknown Unknown 4
## 1666 Unknown Unknown Unknown 1
## 1667 Unknown Unknown Unknown 1
## 1668 Unknown Unknown Unknown 3
## 1669 Unknown Unknown Unknown 4
## 1670 Unknown Unknown Unknown 1
## 1671 Unknown Unknown Unknown 3
## 1672 Unknown Unknown Unknown 3
## 1673 Unknown Unknown Unknown 3
## 1674 Unknown Unknown Unknown 4
## 1675 Unknown Unknown Unknown 2
## 1676 Unknown Unknown Unknown 3
## 1677 Unknown Unknown Unknown 3
## 1678 Unknown Unknown Unknown 2
## 1679 Unknown Unknown Unknown 3
## 1680 Unknown Unknown Unknown 3
## 1681 Unknown Unknown Unknown 3
## 1682 Unknown Unknown Unknown 3
## 1683 Unknown Unknown Unknown 4
## 1684 Unknown Unknown Unknown 3
## 1685 Unknown Unknown Unknown 3
## 1686 Unknown Unknown Unknown 5
## 1687 Unknown Unknown Unknown 4
## 1688 Unknown Unknown Unknown 2
## 1689 Unknown Unknown Unknown 3
## 1690 Unknown Unknown Unknown 3
## 1691 Unknown Unknown Unknown 1
## 1692 Unknown Unknown Unknown 4
## 1693 Unknown Unknown Unknown 3
## 1694 Unknown Unknown Unknown 4
## 1695 Unknown Unknown Unknown 4
## 1696 Unknown Unknown Unknown 5
## 1697 Unknown Unknown Unknown 3
## 1698 Unknown Unknown Unknown 4
## 1699 Unknown Unknown Unknown 3
## 1700 Unknown Unknown Unknown 4
## 1701 Unknown Unknown Unknown 1
## 1702 Unknown Unknown Unknown 4
## 1703 Unknown Unknown Unknown 3
## 1704 Unknown Unknown Unknown 4
## 1705 Unknown Unknown Unknown 4
## 1706 Unknown Unknown Unknown 4
## 1707 Unknown Unknown Unknown 4
## 1708 Unknown Unknown Unknown 2
## 1709 Unknown Unknown Unknown 4
## 1710 Unknown Unknown Unknown 4
## 1711 Unknown Unknown Unknown 4
## 1712 Unknown Unknown Unknown 4
## 1713 Unknown Unknown Unknown 3
## 1714 Unknown Unknown Unknown 3
## 1715 Unknown Unknown Unknown 3
## 1716 Unknown Unknown Unknown 4
## 1717 Unknown Unknown Unknown 4
## 1718 Unknown Unknown Unknown 4
## 1719 Unknown Unknown Unknown 3
## 1720 Unknown Unknown Unknown 2
## 1721 Unknown Unknown Unknown 4
## 1722 Unknown Unknown Unknown 3
## 1723 Unknown Unknown Unknown 4
## 1724 Unknown Unknown Unknown 5
## 1725 Unknown Unknown Unknown 3
## 1726 Unknown Unknown Unknown 4
## 1727 Unknown Unknown Unknown 4
## 1728 Unknown Unknown Unknown 3
## 1729 Unknown Unknown Unknown 1
## 1730 Unknown Unknown Unknown 4
## 1731 Unknown Unknown Unknown 4
## 1732 Unknown Unknown Unknown 5
## 1733 Unknown Unknown Unknown 2
## 1734 Unknown Unknown Unknown 4
## 1735 Unknown Unknown Unknown 4
## 1736 Unknown Unknown Unknown 3
## 1737 Unknown Unknown Unknown 3
## 1738 Unknown Unknown Unknown 4
## 1739 Unknown Unknown Unknown 5
## 1740 Unknown Unknown Unknown 1
## 1741 Unknown Unknown Unknown 4
## 1742 Unknown Unknown Unknown 1
## 1743 Unknown Unknown Unknown 4
## 1744 Unknown Unknown Unknown 3
## 1745 Unknown Unknown Unknown 3
## 1746 Unknown Unknown Unknown 0
## 1747 Unknown Unknown Unknown 4
## 1748 Unknown Unknown Unknown 4
## 1749 Unknown Unknown Unknown 3
## 1750 Unknown Unknown Unknown 1
## 1751 Unknown Unknown Unknown 4
## 1752 Unknown Unknown Unknown 3
## 1753 Unknown Unknown Unknown 4
## 1754 Unknown Unknown Unknown 3
## 1755 Unknown Unknown Unknown 5
## 1756 Unknown Unknown Unknown 2
## 1757 Unknown Unknown Unknown 5
## 1758 Unknown Unknown Unknown 2
## 1759 Unknown Unknown Unknown 4
## 1760 Unknown Unknown Unknown 3
## 1761 Unknown Unknown Unknown 2
## 1762 Unknown Unknown Unknown 2
## 1763 Unknown Unknown Unknown 4
## 1764 Unknown Unknown Unknown 3
## 1765 Unknown Unknown Unknown 5
## 1766 Unknown Unknown Unknown 3
## 1767 Unknown Unknown Unknown 3
## 1768 Unknown Unknown Unknown 2
## 1769 Unknown Unknown Unknown 4
## 1770 Unknown Unknown Unknown 3
## 1771 Unknown Unknown Unknown 4
## 1772 Unknown Unknown Unknown 4
## 1773 Unknown Unknown Unknown 4
## 1774 Unknown Unknown Unknown 1
## 1775 Unknown Unknown Unknown 3
## 1776 Unknown Unknown Unknown 3
## 1777 Unknown Unknown Unknown 3
## 1778 Unknown Unknown Unknown 3
## 1779 Unknown Unknown Unknown 4
## 1780 Unknown Unknown Unknown 5
## 1781 Unknown Unknown Unknown 2
## 1782 Unknown Unknown Unknown 2
## 1783 Unknown Unknown Unknown 3
## 1784 Unknown Unknown Unknown 1
## 1785 Unknown Unknown Unknown 5
## 1786 Unknown Unknown Unknown 3
## 1787 Unknown Unknown Unknown 2
## 1788 Unknown Unknown Unknown 5
## 1789 Unknown Unknown Unknown 2
## 1790 Unknown Unknown Unknown 5
## 1791 Unknown Unknown Unknown 4
## 1792 Unknown Unknown Unknown 3
## 1793 Unknown Unknown Unknown 3
## 1794 Unknown Unknown Unknown 3
## 1795 Unknown Unknown Unknown 3
## 1796 Unknown Unknown Unknown 3
## 1797 Unknown Unknown Unknown 4
## 1798 Unknown Unknown Unknown 4
## 1799 Unknown Unknown Unknown 4
## 1800 Unknown Unknown Unknown 2
## 1801 Unknown Unknown Unknown 3
## 1802 Unknown Unknown Unknown 3
## 1803 Unknown Unknown Unknown 4
## 1804 Unknown Unknown Unknown 3
## 1805 Unknown Unknown Unknown 3
## 1806 Unknown Unknown Unknown 2
## 1807 Unknown Unknown Unknown 4
## 1808 Unknown Unknown Unknown 3
## 1809 Unknown Unknown Unknown 1
## 1810 Unknown Unknown Unknown 4
## 1811 Unknown Unknown Unknown 1
## 1812 Unknown Unknown Unknown 2
## 1813 Unknown Unknown Unknown 2
## 1814 Unknown Unknown Unknown 3
## 1815 Unknown Unknown Unknown 4
## 1816 Unknown Unknown Unknown 3
## 1817 Unknown Unknown Unknown 3
## 1818 Unknown Unknown Unknown 4
## 1819 Unknown Unknown Unknown 3
## 1820 Unknown Unknown Unknown 4
## 1821 Unknown Unknown Unknown 3
## 1822 Unknown Unknown Unknown 5
## 1823 Unknown Unknown Unknown 4
## 1824 Unknown Unknown Unknown 3
## 1825 Unknown Unknown Unknown 2
## 1826 Unknown Unknown Unknown 4
## 1827 Unknown Unknown Unknown 4
## 1828 Unknown Unknown Unknown 4
## 1829 Unknown Unknown Unknown 3
## 1830 Unknown Unknown Unknown 3
## 1831 Unknown Unknown Unknown 4
## 1832 Unknown Unknown Unknown 3
## 1833 Unknown Unknown Unknown 3
## 1834 Unknown Unknown Unknown 2
## 1835 Unknown Unknown Unknown 2
## 1836 Unknown Unknown Unknown 3
## 1837 Unknown Unknown Unknown 3
## 1838 Unknown Unknown Unknown 3
## 1839 Unknown Unknown Unknown 3
## 1840 Unknown Unknown Unknown 3
## 1841 Unknown Unknown Unknown 4
## 1842 Unknown Unknown Unknown 2
## 1843 Unknown Unknown Unknown 0
## 1844 Unknown Unknown Unknown 3
## 1845 Unknown Unknown Unknown 4
## 1846 Unknown Unknown Unknown 3
## 1847 Unknown Unknown Unknown 3
## 1848 Unknown Unknown Unknown 2
## 1849 Unknown Unknown Unknown 3
## 1850 Unknown Unknown Unknown 2
## 1851 Unknown Unknown Unknown 1
## 1852 Unknown Unknown Unknown 3
## 1853 Unknown Unknown Unknown 4
## 1854 Unknown Unknown Unknown 3
## 1855 Unknown Unknown Unknown 3
## 1856 Unknown Unknown Unknown 4
## 1857 Unknown Unknown Unknown 4
## 1858 Unknown Unknown Unknown 4
## 1859 Unknown Unknown Unknown 3
## 1860 Unknown Unknown Unknown 4
## 1861 Unknown Unknown Unknown 4
## 1862 Unknown Unknown Unknown 3
## 1863 Unknown Unknown Unknown 4
## 1864 Unknown Unknown Unknown 4
## 1865 Unknown Unknown Unknown 4
## 1866 Unknown Unknown Unknown 3
## 1867 Unknown Unknown Unknown 5
## 1868 Unknown Unknown Unknown 4
## 1869 Unknown Unknown Unknown 4
## 1870 Unknown Unknown Unknown 4
## 1871 Unknown Unknown Unknown 3
## 1872 Unknown Unknown Unknown 2
## 1873 Unknown Unknown Unknown 1
## 1874 Unknown Unknown Unknown 4
## 1875 Unknown Unknown Unknown 1
## 1876 Unknown Unknown Unknown 5
## 1877 Unknown Unknown Unknown 2
## 1878 Unknown Unknown Unknown 3
## 1879 Unknown Unknown Unknown 5
## 1880 Unknown Unknown Unknown 4
## 1881 Unknown Unknown Unknown 5
## 1882 Unknown Unknown Unknown 3
## 1883 Unknown Unknown Unknown 4
## 1884 Unknown Unknown Unknown 2
## 1885 Unknown Unknown Unknown 5
## 1886 Unknown Unknown Unknown 3
## 1887 Unknown Unknown Unknown 3
## 1888 Unknown Unknown Unknown 4
## 1889 Unknown Unknown Unknown 4
## 1890 Unknown Unknown Unknown 3
## 1891 Unknown Unknown Unknown 4
## 1892 Unknown Unknown Unknown 5
## 1893 Unknown Unknown Unknown 5
## 1894 Unknown Unknown Unknown 3
## 1895 Unknown Unknown Unknown 2
## 1896 Unknown Unknown Unknown 3
## 1897 Unknown Unknown Unknown 3
## 1898 Unknown Unknown Unknown 3
## 1899 Unknown Unknown Unknown 1
## 1900 Unknown Unknown Unknown 4
## 1901 Unknown Unknown Unknown 3
## 1902 Unknown Unknown Unknown 4
## 1903 Unknown Unknown Unknown 4
## 1904 Unknown Unknown Unknown 4
## 1905 Unknown Unknown Unknown 3
## 1906 Unknown Unknown Unknown 5
## 1907 Unknown Unknown Unknown 2
## 1908 Unknown Unknown Unknown 3
## 1909 Unknown Unknown Unknown 4
## 1910 Unknown Unknown Unknown 5
## 1911 Unknown Unknown Unknown 4
## 1912 Unknown Unknown Unknown 1
## 1913 Unknown Unknown Unknown 3
## 1914 Unknown Unknown Unknown 1
## 1915 Unknown Unknown Unknown 4
## 1916 Unknown Unknown Unknown 3
## 1917 Unknown Unknown Unknown 1
## 1918 Unknown Unknown Unknown 3
## 1919 Unknown Unknown Unknown 5
## 1920 Unknown Unknown Unknown 4
## 1921 Unknown Unknown Unknown 0
## 1922 Unknown Unknown Unknown 1
## 1923 Unknown Unknown Unknown 3
## 1924 Unknown Unknown Unknown 5
## 1925 Unknown Unknown Unknown 2
## 1926 Unknown Unknown Unknown 3
## 1927 Unknown Unknown Unknown 3
## 1928 Unknown Unknown Unknown 4
## 1929 Unknown Unknown Unknown 5
## 1930 Unknown Unknown Unknown 4
## 1931 Unknown Unknown Unknown 4
## 1932 Unknown Unknown Unknown 1
## 1933 Unknown Unknown Unknown 0
## 1934 Unknown Unknown Unknown 4
## 1935 Unknown Unknown Unknown 1
## 1936 Unknown Unknown Unknown 4
## 1937 Unknown Unknown Unknown 4
## 1938 Unknown Unknown Unknown 3
## 1939 Unknown Unknown Unknown 4
## 1940 Unknown Unknown Unknown 5
## 1941 Unknown Unknown Unknown 4
## 1942 Unknown Unknown Unknown 4
## 1943 Unknown Unknown Unknown 1
## 1944 Unknown Unknown Unknown 4
## 1945 Unknown Unknown Unknown 5
## 1946 Unknown Unknown Unknown 5
## 1947 Unknown Unknown Unknown 4
## 1948 Unknown Unknown Unknown 4
## 1949 Unknown Unknown Unknown 4
## 1950 Unknown Unknown Unknown 4
## 1951 Unknown Unknown Unknown 4
## 1952 Unknown Unknown Unknown 4
## 1953 Unknown Unknown Unknown 5
## 1954 Unknown Unknown Unknown 4
## 1955 Unknown Unknown Unknown 2
## 1956 Unknown Unknown Unknown 1
## 1957 Unknown Unknown Unknown 3
## 1958 Unknown Unknown Unknown 3
## 1959 Unknown Unknown Unknown 5
## 1960 Unknown Unknown Unknown 4
## 1961 Unknown Unknown Unknown 3
## 1962 Unknown Unknown Unknown 3
## 1963 Unknown Unknown Unknown 4
## 1964 Unknown Unknown Unknown 1
## 1965 Unknown Unknown Unknown 4
## 1966 Unknown Unknown Unknown 5
## 1967 Unknown Unknown Unknown 3
## 1968 Unknown Unknown Unknown 3
## 1969 Unknown Unknown Unknown 0
## 1970 Unknown Unknown Unknown 5
## 1971 Unknown Unknown Unknown 4
## 1972 Unknown Unknown Unknown 4
## 1973 Unknown Unknown Unknown 3
## 1974 Unknown Unknown Unknown 4
## 1975 Unknown Unknown Unknown 4
## 1976 Unknown Unknown Unknown 3
## 1977 Unknown Unknown Unknown 3
## 1978 Unknown Unknown Unknown 3
## 1979 Unknown Unknown Unknown 5
## 1980 Unknown Unknown Unknown 5
## 1981 Unknown Unknown Unknown 4
## 1982 Unknown Unknown Unknown 2
## 1983 Unknown Unknown Unknown 3
## 1984 Unknown Unknown Unknown 4
## 1985 Unknown Unknown Unknown 3
## 1986 Unknown Unknown Unknown 4
## 1987 Unknown Unknown Unknown 1
## 1988 Unknown Unknown Unknown 5
## 1989 Unknown Unknown Unknown 3
## 1990 Unknown Unknown Unknown 3
## 1991 Unknown Unknown Unknown 4
## 1992 Unknown Unknown Unknown 4
## 1993 Unknown Unknown Unknown 2
## 1994 Unknown Unknown Unknown 3
## 1995 Unknown Unknown Unknown 4
## 1996 Unknown Unknown Unknown 4
## 1997 Unknown Unknown Unknown 4
## 1998 Unknown Unknown Unknown 5
## 1999 Unknown Unknown Unknown 4
## 2000 Unknown Unknown Unknown 1
## 2001 Unknown Unknown Unknown 1
## 2002 Unknown Unknown Unknown 5
## 2003 Unknown Unknown Unknown 1
## 2004 Unknown Unknown Unknown 4
## 2005 Unknown Unknown Unknown 4
## 2006 Unknown Unknown Unknown 4
## 2007 Unknown Unknown Unknown 4
## 2008 Unknown Unknown Unknown 1
## 2009 Unknown Unknown Unknown 3
## 2010 Unknown Unknown Unknown 4
## 2011 Unknown Unknown Unknown 3
## 2012 Unknown Unknown Unknown 5
## 2013 Unknown Unknown Unknown 2
## 2014 Unknown Unknown Unknown 4
## 2015 Unknown Unknown Unknown 1
## 2016 Unknown Unknown Unknown 1
## 2017 Unknown Unknown Unknown 4
## 2018 Unknown Unknown Unknown 2
## 2019 Unknown Unknown Unknown 3
## 2020 Unknown Unknown Unknown 1
## 2021 Unknown Unknown Unknown 0
## 2022 Unknown Unknown Unknown 3
## 2023 Unknown Unknown Unknown 1
## 2024 Unknown Unknown Unknown 5
## 2025 Unknown Unknown Unknown 1
## 2026 Unknown Unknown Unknown 2
## 2027 Unknown Unknown Unknown 3
## 2028 Unknown Unknown Unknown 3
## 2029 Unknown Unknown Unknown 4
## 2030 Unknown Unknown Unknown 3
## 2031 Unknown Unknown Unknown 3
## 2032 Unknown Unknown Unknown 5
## 2033 Unknown Unknown Unknown 1
## 2034 Unknown Unknown Unknown 5
## 2035 Unknown Unknown Unknown 3
## 2036 Unknown Unknown Unknown 3
## 2037 Unknown Unknown Unknown 2
## 2038 Unknown Unknown Unknown 5
## 2039 Unknown Unknown Unknown 2
## 2040 Unknown Unknown Unknown 4
## 2041 Unknown Unknown Unknown 3
## 2042 Unknown Unknown Unknown 4
## 2043 Unknown Unknown Unknown 3
## 2044 Unknown Unknown Unknown 1
## 2045 Unknown Unknown Unknown 2
## 2046 Unknown Unknown Unknown 2
## 2047 Unknown Unknown Unknown 4
## 2048 Unknown Unknown Unknown 5
## 2049 Unknown Unknown Unknown 2
## 2050 Unknown Unknown Unknown 4
## 2051 Unknown Unknown Unknown 2
## 2052 Unknown Unknown Unknown 2
## 2053 Unknown Unknown Unknown 4
## 2054 Unknown Unknown Unknown 2
## 2055 Unknown Unknown Unknown 3
## 2056 Unknown Unknown Unknown 4
## 2057 Unknown Unknown Unknown 4
## 2058 Unknown Unknown Unknown 3
## 2059 Unknown Unknown Unknown 3
## 2060 Unknown Unknown Unknown 1
## 2061 Unknown Unknown Unknown 3
## 2062 Unknown Unknown Unknown 1
## 2063 Unknown Unknown Unknown 1
## 2064 Unknown Unknown Unknown 1
## Cabin.Staff.Service Food...Beverages Ground.Service Value.For.Money
## 1 5 3 4 4
## 2 5 3 5 5
## 3 5 4 5 5
## 4 2 1 3 3
## 5 5 2 4 5
## 6 2 2 1 1
## 7 5 2 1 1
## 8 3 2 1 1
## 9 1 2 1 1
## 10 5 2 3 5
## 11 1 2 1 1
## 12 1 1 1 1
## 13 2 1 1 2
## 14 5 3 5 5
## 15 3 2 1 5
## 16 4 2 4 5
## 17 2 2 1 3
## 18 3 1 1 1
## 19 5 2 4 5
## 20 2 2 1 2
## 21 3 2 1 1
## 22 3 2 1 1
## 23 2 2 1 1
## 24 3 2 3 4
## 25 1 1 1 1
## 26 3 5 4 5
## 27 3 2 3 3
## 28 2 2 1 1
## 29 1 2 1 1
## 30 4 2 1 5
## 31 1 1 1 1
## 32 1 1 1 1
## 33 2 2 1 1
## 34 3 2 3 1
## 35 1 1 1 1
## 36 1 2 1 1
## 37 2 2 1 3
## 38 1 1 1 1
## 39 1 1 1 1
## 40 1 2 2 4
## 41 5 3 3 4
## 42 5 5 4 4
## 43 1 1 1 1
## 44 2 2 1 1
## 45 2 2 1 1
## 46 2 1 1 2
## 47 1 2 1 4
## 48 3 1 1 1
## 49 2 2 1 2
## 50 1 2 2 3
## 51 3 2 1 1
## 52 3 1 1 4
## 53 1 2 1 3
## 54 5 2 4 5
## 55 3 2 1 1
## 56 1 1 1 1
## 57 5 2 3 4
## 58 1 2 1 1
## 59 1 2 1 1
## 60 3 2 1 1
## 61 5 5 5 5
## 62 3 2 1 1
## 63 3 2 2 4
## 64 1 2 1 1
## 65 1 2 1 1
## 66 1 1 1 1
## 67 3 2 1 1
## 68 2 1 2 1
## 69 3 2 1 1
## 70 4 2 2 3
## 71 1 2 1 1
## 72 5 3 1 1
## 73 3 2 2 5
## 74 4 3 4 5
## 75 1 2 1 1
## 76 1 2 1 1
## 77 4 2 1 1
## 78 2 2 2 3
## 79 3 2 3 5
## 80 1 2 1 1
## 81 5 2 5 5
## 82 1 1 1 1
## 83 1 1 1 2
## 84 1 2 1 1
## 85 1 2 1 1
## 86 3 2 1 1
## 87 5 3 3 5
## 88 2 2 1 5
## 89 5 2 5 5
## 90 5 2 5 5
## 91 3 1 4 3
## 92 2 2 1 1
## 93 5 5 5 5
## 94 5 2 5 5
## 95 2 1 1 1
## 96 5 5 5 5
## 97 1 1 1 1
## 98 2 2 1 1
## 99 2 2 1 1
## 100 4 2 5 3
## 101 4 2 3 4
## 102 2 2 1 1
## 103 2 2 1 1
## 104 1 2 1 1
## 105 1 2 1 1
## 106 3 2 1 1
## 107 5 3 4 5
## 108 2 2 1 1
## 109 1 2 1 1
## 110 1 1 1 1
## 111 3 2 1 1
## 112 4 2 1 5
## 113 1 1 1 1
## 114 2 2 2 2
## 115 5 5 5 5
## 116 5 2 5 5
## 117 1 2 2 2
## 118 4 2 5 5
## 119 2 2 1 1
## 120 3 2 4 5
## 121 5 2 4 5
## 122 1 1 1 1
## 123 5 5 5 5
## 124 2 2 2 1
## 125 5 2 3 5
## 126 1 1 1 1
## 127 1 1 1 1
## 128 1 1 1 1
## 129 1 2 1 1
## 130 1 2 1 1
## 131 2 2 2 3
## 132 1 1 1 1
## 133 5 5 3 5
## 134 5 2 1 1
## 135 2 1 1 1
## 136 3 2 1 1
## 137 5 4 5 5
## 138 3 2 4 5
## 139 1 1 1 2
## 140 1 2 1 2
## 141 2 2 1 2
## 142 1 2 1 1
## 143 1 2 1 4
## 144 3 2 1 1
## 145 3 2 3 3
## 146 1 1 3 3
## 147 3 2 1 1
## 148 1 2 1 1
## 149 1 2 2 4
## 150 5 5 5 5
## 151 2 2 2 1
## 152 2 1 2 4
## 153 1 1 1 1
## 154 1 2 4 5
## 155 1 2 1 1
## 156 4 2 1 2
## 157 1 1 1 1
## 158 1 2 1 1
## 159 1 2 1 1
## 160 5 5 5 5
## 161 2 1 1 1
## 162 4 2 1 1
## 163 2 1 1 1
## 164 1 2 1 1
## 165 3 2 4 3
## 166 1 2 1 1
## 167 5 2 4 4
## 168 2 2 1 1
## 169 3 2 3 1
## 170 1 2 1 1
## 171 3 2 1 1
## 172 5 2 1 3
## 173 3 2 1 3
## 174 1 2 1 1
## 175 2 2 1 1
## 176 1 1 1 1
## 177 3 2 1 2
## 178 5 2 5 5
## 179 1 2 1 1
## 180 2 1 3 5
## 181 1 2 1 1
## 182 1 1 1 1
## 183 1 2 5 3
## 184 5 2 5 3
## 185 1 1 1 1
## 186 4 2 4 5
## 187 4 4 5 5
## 188 2 1 2 1
## 189 3 2 1 1
## 190 1 2 1 1
## 191 1 2 1 1
## 192 1 2 1 1
## 193 1 1 1 1
## 194 3 2 5 5
## 195 3 2 1 1
## 196 1 2 1 1
## 197 1 1 1 1
## 198 1 1 1 1
## 199 3 2 1 1
## 200 3 2 1 1
## 201 3 2 5 3
## 202 2 2 4 5
## 203 5 2 1 2
## 204 1 1 1 1
## 205 3 1 2 1
## 206 1 2 1 1
## 207 1 1 1 1
## 208 4 3 3 5
## 209 4 5 4 5
## 210 2 1 1 2
## 211 1 2 1 1
## 212 1 1 1 1
## 213 5 1 1 1
## 214 1 1 3 1
## 215 1 1 1 1
## 216 5 4 4 5
## 217 1 2 1 1
## 218 2 1 3 4
## 219 2 2 1 2
## 220 2 1 1 1
## 221 2 1 1 2
## 222 2 2 1 2
## 223 3 3 1 3
## 224 1 1 1 1
## 225 4 4 5 5
## 226 2 1 1 2
## 227 4 3 4 4
## 228 1 1 1 2
## 229 1 2 1 1
## 230 2 2 2 3
## 231 1 2 1 1
## 232 3 2 3 3
## 233 1 1 1 1
## 234 3 2 1 1
## 235 1 1 3 3
## 236 1 1 1 1
## 237 2 2 1 1
## 238 1 2 1 1
## 239 5 3 4 4
## 240 2 1 1 2
## 241 2 2 1 1
## 242 4 2 2 4
## 243 1 2 1 1
## 244 1 2 1 1
## 245 3 2 3 1
## 246 2 1 1 1
## 247 2 1 1 1
## 248 5 3 5 5
## 249 5 5 5 5
## 250 2 2 1 1
## 251 3 2 1 1
## 252 1 2 1 1
## 253 3 2 1 1
## 254 3 2 1 1
## 255 1 2 1 1
## 256 1 2 1 1
## 257 3 3 1 4
## 258 5 3 5 5
## 259 1 1 1 1
## 260 1 2 1 1
## 261 4 3 2 5
## 262 5 2 5 5
## 263 1 2 1 1
## 264 3 2 1 1
## 265 3 2 1 5
## 266 2 2 1 3
## 267 1 2 1 1
## 268 1 2 1 1
## 269 3 2 1 5
## 270 2 2 2 2
## 271 3 2 1 1
## 272 1 2 5 5
## 273 1 1 1 1
## 274 1 2 1 1
## 275 1 2 1 1
## 276 1 3 1 1
## 277 5 2 5 5
## 278 1 1 1 1
## 279 5 2 5 5
## 280 3 2 1 1
## 281 1 1 1 1
## 282 3 3 1 1
## 283 1 2 1 1
## 284 3 2 1 1
## 285 1 2 3 2
## 286 2 2 2 2
## 287 3 2 1 1
## 288 1 1 1 2
## 289 1 1 1 2
## 290 2 2 1 3
## 291 1 2 1 1
## 292 3 2 3 4
## 293 3 2 3 3
## 294 2 2 3 4
## 295 3 2 1 1
## 296 3 2 1 1
## 297 5 3 4 5
## 298 4 2 4 5
## 299 1 2 1 1
## 300 1 2 1 1
## 301 4 2 3 5
## 302 1 1 1 1
## 303 5 2 5 5
## 304 3 2 1 1
## 305 3 2 1 1
## 306 3 2 1 1
## 307 3 2 1 1
## 308 3 2 1 1
## 309 4 3 4 1
## 310 1 2 1 1
## 311 1 2 1 1
## 312 3 2 1 1
## 313 3 2 1 1
## 314 5 2 5 5
## 315 5 2 5 5
## 316 3 2 1 1
## 317 1 2 3 2
## 318 5 3 1 3
## 319 2 2 1 1
## 320 3 2 1 1
## 321 5 4 4 5
## 322 1 1 1 1
## 323 3 2 1 1
## 324 3 2 1 1
## 325 3 2 1 2
## 326 3 2 1 1
## 327 3 2 3 2
## 328 3 2 1 1
## 329 5 2 5 5
## 330 3 2 1 1
## 331 1 2 1 1
## 332 2 2 1 1
## 333 5 3 5 5
## 334 3 2 1 1
## 335 3 2 1 1
## 336 5 2 4 4
## 337 5 2 5 5
## 338 4 3 3 5
## 339 5 2 5 5
## 340 3 2 1 1
## 341 3 2 1 1
## 342 3 2 1 1
## 343 3 2 1 1
## 344 3 2 1 1
## 345 3 2 1 2
## 346 3 2 1 1
## 347 3 2 1 1
## 348 3 2 1 1
## 349 1 1 1 1
## 350 3 3 4 3
## 351 3 2 1 1
## 352 3 2 1 2
## 353 4 2 2 2
## 354 3 2 1 5
## 355 3 2 3 3
## 356 5 1 4 3
## 357 3 2 1 1
## 358 3 2 1 2
## 359 3 2 1 1
## 360 4 2 4 5
## 361 3 2 1 1
## 362 1 1 1 2
## 363 1 2 1 1
## 364 2 1 1 1
## 365 1 2 1 1
## 366 5 2 4 5
## 367 1 2 1 1
## 368 1 2 1 1
## 369 1 1 1 1
## 370 5 2 5 5
## 371 2 1 2 1
## 372 3 2 1 5
## 373 5 5 4 5
## 374 1 1 1 1
## 375 3 2 1 1
## 376 1 2 1 1
## 377 1 2 1 1
## 378 1 2 1 2
## 379 5 2 5 5
## 380 4 2 5 4
## 381 3 2 2 5
## 382 5 2 5 5
## 383 1 1 1 1
## 384 5 3 4 4
## 385 1 1 1 1
## 386 3 1 1 1
## 387 2 2 1 1
## 388 4 2 3 5
## 389 1 2 1 1
## 390 5 3 4 5
## 391 2 2 1 2
## 392 1 1 1 1
## 393 1 2 1 1
## 394 2 2 2 1
## 395 1 1 1 1
## 396 5 2 5 5
## 397 3 2 1 4
## 398 5 2 5 5
## 399 2 1 1 1
## 400 4 2 1 1
## 401 3 2 1 1
## 402 3 2 1 1
## 403 4 2 2 5
## 404 1 2 1 1
## 405 1 1 1 1
## 406 1 2 1 1
## 407 3 2 1 3
## 408 2 2 1 1
## 409 1 2 1 1
## 410 2 1 1 2
## 411 3 2 1 1
## 412 4 3 1 3
## 413 1 2 1 1
## 414 2 1 2 2
## 415 1 1 1 1
## 416 4 1 1 1
## 417 1 1 1 1
## 418 3 2 4 4
## 419 2 2 2 1
## 420 3 2 2 1
## 421 3 2 1 1
## 422 1 2 1 1
## 423 5 2 5 1
## 424 3 2 1 1
## 425 2 1 1 1
## 426 2 2 3 3
## 427 3 2 5 4
## 428 4 4 4 5
## 429 3 2 2 1
## 430 3 2 1 3
## 431 1 2 1 1
## 432 3 2 1 1
## 433 1 2 1 1
## 434 1 2 1 1
## 435 1 2 1 1
## 436 3 2 2 3
## 437 4 3 3 5
## 438 1 2 1 1
## 439 1 1 1 1
## 440 1 2 1 1
## 441 1 2 1 1
## 442 3 2 1 2
## 443 3 2 1 1
## 444 2 2 1 2
## 445 1 2 1 1
## 446 1 1 1 1
## 447 4 1 1 1
## 448 1 2 1 1
## 449 1 1 1 1
## 450 1 1 1 1
## 451 2 2 2 2
## 452 1 2 1 1
## 453 5 2 5 5
## 454 4 4 1 5
## 455 2 2 1 1
## 456 3 2 1 1
## 457 1 1 1 1
## 458 3 2 5 5
## 459 3 2 2 1
## 460 3 2 1 1
## 461 3 2 1 1
## 462 2 1 1 1
## 463 1 1 1 1
## 464 3 2 1 1
## 465 3 2 1 2
## 466 4 2 2 3
## 467 3 2 3 4
## 468 1 2 1 1
## 469 3 2 1 1
## 470 4 2 2 3
## 471 4 1 1 1
## 472 4 2 4 5
## 473 2 2 1 1
## 474 3 2 1 3
## 475 1 2 1 2
## 476 2 2 1 1
## 477 5 5 5 5
## 478 1 2 1 1
## 479 1 1 1 1
## 480 3 2 1 1
## 481 1 2 2 3
## 482 1 1 1 1
## 483 1 2 1 1
## 484 1 1 1 1
## 485 1 1 1 1
## 486 1 1 1 1
## 487 1 1 1 1
## 488 1 1 1 1
## 489 2 2 1 2
## 490 3 2 1 1
## 491 1 1 1 1
## 492 1 1 1 1
## 493 1 2 1 1
## 494 1 2 1 1
## 495 2 1 1 1
## 496 1 1 1 1
## 497 3 2 1 1
## 498 1 2 1 1
## 499 1 2 1 1
## 500 3 2 1 1
## 501 3 2 1 3
## 502 1 2 1 1
## 503 4 2 2 3
## 504 2 2 1 1
## 505 3 2 1 1
## 506 2 2 1 1
## 507 3 2 1 2
## 508 5 5 5 5
## 509 1 1 1 1
## 510 1 2 1 1
## 511 2 2 1 2
## 512 1 1 1 1
## 513 4 2 2 1
## 514 3 2 3 5
## 515 4 2 5 5
## 516 1 1 1 1
## 517 5 5 5 5
## 518 1 1 1 1
## 519 1 2 1 2
## 520 4 2 1 1
## 521 3 2 1 2
## 522 4 2 5 5
## 523 1 2 1 1
## 524 1 1 1 1
## 525 2 2 2 2
## 526 5 2 5 5
## 527 1 1 1 1
## 528 1 2 1 1
## 529 3 2 1 1
## 530 2 2 2 2
## 531 1 2 1 1
## 532 5 5 1 4
## 533 1 2 1 1
## 534 3 2 1 1
## 535 2 2 1 4
## 536 1 2 1 1
## 537 1 2 1 1
## 538 1 1 1 1
## 539 2 1 1 1
## 540 1 2 1 1
## 541 1 1 1 1
## 542 1 2 3 1
## 543 3 2 1 2
## 544 1 2 1 1
## 545 1 1 1 1
## 546 1 2 1 2
## 547 1 2 1 1
## 548 4 2 3 3
## 549 1 1 1 1
## 550 2 2 1 1
## 551 1 2 1 1
## 552 1 2 1 1
## 553 3 1 3 1
## 554 3 1 1 2
## 555 1 2 1 1
## 556 1 2 2 1
## 557 4 4 4 4
## 558 3 2 1 1
## 559 1 1 1 1
## 560 2 2 1 1
## 561 1 2 1 1
## 562 3 2 1 4
## 563 1 2 3 1
## 564 4 2 3 4
## 565 1 2 3 5
## 566 3 1 1 3
## 567 1 1 1 1
## 568 2 2 1 2
## 569 2 1 2 3
## 570 1 2 1 1
## 571 2 2 1 2
## 572 1 1 1 1
## 573 3 2 2 2
## 574 1 1 1 1
## 575 2 2 2 2
## 576 1 2 1 1
## 577 1 1 1 1
## 578 2 2 1 2
## 579 1 2 1 1
## 580 4 2 5 3
## 581 1 2 1 1
## 582 2 2 1 1
## 583 5 3 5 3
## 584 4 2 3 4
## 585 1 2 1 1
## 586 5 3 5 5
## 587 3 2 3 1
## 588 1 2 2 2
## 589 2 1 2 2
## 590 3 3 2 3
## 591 4 2 4 5
## 592 4 2 5 5
## 593 4 2 1 3
## 594 3 2 1 1
## 595 5 2 4 5
## 596 1 2 1 1
## 597 1 2 1 1
## 598 2 2 1 2
## 599 1 1 1 1
## 600 3 2 5 2
## 601 1 2 1 1
## 602 2 1 2 2
## 603 1 1 1 1
## 604 1 1 1 1
## 605 1 2 1 1
## 606 2 1 2 2
## 607 1 2 1 1
## 608 4 2 4 5
## 609 4 2 5 5
## 610 5 1 2 2
## 611 3 2 1 2
## 612 1 2 1 1
## 613 3 1 3 1
## 614 1 2 1 1
## 615 1 1 1 1
## 616 1 1 1 1
## 617 1 2 1 1
## 618 1 1 1 1
## 619 3 2 1 1
## 620 3 2 1 1
## 621 1 1 1 1
## 622 5 3 4 5
## 623 1 2 1 1
## 624 2 2 2 4
## 625 2 2 1 2
## 626 3 2 1 3
## 627 1 2 1 1
## 628 1 2 1 2
## 629 4 4 2 3
## 630 5 4 5 5
## 631 5 2 4 5
## 632 4 2 3 5
## 633 5 5 5 5
## 634 3 3 1 1
## 635 1 2 1 1
## 636 2 2 1 1
## 637 4 2 3 3
## 638 3 2 1 1
## 639 2 2 1 2
## 640 3 2 1 1
## 641 4 3 3 5
## 642 5 2 1 4
## 643 1 2 1 1
## 644 3 2 2 1
## 645 2 1 2 1
## 646 4 2 1 3
## 647 2 2 1 2
## 648 2 2 1 1
## 649 1 1 2 1
## 650 1 2 1 4
## 651 1 1 1 1
## 652 3 2 4 5
## 653 3 1 1 1
## 654 4 2 4 5
## 655 4 2 4 5
## 656 1 2 1 2
## 657 1 2 1 1
## 658 5 3 4 5
## 659 2 2 1 1
## 660 4 2 4 5
## 661 4 2 1 1
## 662 1 1 1 1
## 663 2 1 1 2
## 664 1 2 1 1
## 665 3 2 1 1
## 666 2 1 1 1
## 667 1 1 1 1
## 668 2 1 1 1
## 669 3 2 3 5
## 670 5 2 3 2
## 671 1 2 1 1
## 672 1 1 1 2
## 673 3 2 1 1
## 674 1 1 1 1
## 675 5 2 5 5
## 676 1 2 2 1
## 677 3 1 1 1
## 678 3 4 4 4
## 679 1 1 1 1
## 680 1 1 1 1
## 681 3 2 1 1
## 682 1 2 1 1
## 683 1 2 3 3
## 684 4 2 2 2
## 685 3 2 1 1
## 686 1 2 1 1
## 687 1 1 1 1
## 688 1 2 1 1
## 689 2 2 2 1
## 690 4 1 4 1
## 691 3 2 4 3
## 692 3 2 2 2
## 693 1 2 1 2
## 694 3 2 1 2
## 695 2 1 1 2
## 696 1 2 1 1
## 697 1 2 1 1
## 698 3 2 1 2
## 699 5 2 5 5
## 700 1 2 1 1
## 701 2 2 3 5
## 702 1 2 1 1
## 703 1 2 1 1
## 704 3 2 1 1
## 705 1 2 2 3
## 706 1 2 1 1
## 707 1 1 1 1
## 708 5 2 5 5
## 709 1 1 2 1
## 710 1 1 1 1
## 711 5 2 5 5
## 712 4 2 5 4
## 713 1 2 1 1
## 714 1 2 1 1
## 715 1 2 1 1
## 716 5 3 1 1
## 717 3 1 1 2
## 718 5 5 5 4
## 719 3 4 4 5
## 720 3 2 1 1
## 721 5 2 5 5
## 722 2 1 3 4
## 723 5 2 5 5
## 724 2 2 1 1
## 725 1 2 2 2
## 726 1 1 1 1
## 727 3 1 1 1
## 728 5 2 3 4
## 729 5 5 5 5
## 730 3 3 1 1
## 731 5 5 5 5
## 732 5 2 3 5
## 733 4 3 4 5
## 734 3 1 2 1
## 735 2 1 1 5
## 736 4 2 1 3
## 737 5 2 5 5
## 738 5 2 4 4
## 739 3 1 1 1
## 740 3 2 1 1
## 741 1 2 1 1
## 742 2 1 1 1
## 743 5 2 2 5
## 744 1 2 1 1
## 745 1 2 1 1
## 746 1 2 1 1
## 747 3 2 3 5
## 748 1 2 1 1
## 749 5 2 3 5
## 750 5 4 4 4
## 751 1 1 1 1
## 752 1 2 1 1
## 753 2 2 2 2
## 754 3 2 4 5
## 755 3 2 1 1
## 756 1 1 1 1
## 757 1 1 1 1
## 758 3 2 1 1
## 759 1 2 1 1
## 760 2 2 1 1
## 761 1 1 1 1
## 762 1 2 1 1
## 763 3 2 1 2
## 764 1 2 1 1
## 765 1 2 1 1
## 766 2 1 1 2
## 767 3 2 2 3
## 768 1 2 1 1
## 769 2 2 1 1
## 770 2 1 1 1
## 771 1 1 1 1
## 772 3 2 1 3
## 773 3 4 2 3
## 774 3 2 1 1
## 775 2 2 1 3
## 776 2 2 1 2
## 777 3 2 1 1
## 778 5 5 3 4
## 779 3 2 1 1
## 780 4 2 1 3
## 781 4 2 5 5
## 782 3 1 1 1
## 783 3 3 1 2
## 784 4 2 2 4
## 785 1 2 1 1
## 786 1 1 1 1
## 787 2 2 1 1
## 788 3 2 1 1
## 789 1 2 1 1
## 790 4 1 4 5
## 791 2 2 1 2
## 792 1 1 1 1
## 793 2 1 1 1
## 794 5 2 5 5
## 795 3 1 1 1
## 796 4 3 4 4
## 797 1 2 3 3
## 798 5 4 2 5
## 799 1 2 1 1
## 800 4 5 3 5
## 801 4 4 2 4
## 802 1 2 1 1
## 803 1 2 1 1
## 804 1 1 1 1
## 805 1 2 1 1
## 806 1 1 1 1
## 807 1 2 2 3
## 808 4 1 2 2
## 809 1 1 1 1
## 810 1 2 1 1
## 811 1 2 1 1
## 812 5 4 4 5
## 813 2 2 5 5
## 814 5 1 5 3
## 815 3 1 1 1
## 816 2 2 5 5
## 817 2 1 1 3
## 818 3 2 3 1
## 819 5 5 5 5
## 820 2 1 1 1
## 821 2 2 3 3
## 822 1 2 1 1
## 823 4 3 1 3
## 824 1 2 1 1
## 825 2 2 1 2
## 826 3 2 1 1
## 827 2 2 2 2
## 828 3 2 4 4
## 829 1 1 1 1
## 830 5 4 4 5
## 831 1 1 3 2
## 832 1 2 1 1
## 833 1 2 1 1
## 834 1 2 1 1
## 835 1 1 1 1
## 836 3 2 1 2
## 837 1 2 1 1
## 838 5 4 3 4
## 839 1 2 1 2
## 840 1 1 1 1
## 841 1 2 1 1
## 842 5 2 5 5
## 843 4 2 4 5
## 844 5 4 2 5
## 845 4 2 4 3
## 846 1 2 1 1
## 847 2 2 1 1
## 848 1 2 1 1
## 849 3 2 1 1
## 850 2 2 3 3
## 851 1 2 1 1
## 852 5 2 4 4
## 853 1 1 1 1
## 854 5 3 2 5
## 855 2 1 1 1
## 856 1 2 1 1
## 857 1 1 1 1
## 858 3 2 1 1
## 859 3 1 2 2
## 860 1 2 1 1
## 861 3 1 1 1
## 862 1 1 1 1
## 863 1 1 1 1
## 864 3 2 1 1
## 865 1 1 1 1
## 866 2 2 1 1
## 867 5 2 4 5
## 868 3 3 2 2
## 869 3 2 2 1
## 870 4 2 2 3
## 871 1 2 1 1
## 872 1 1 1 1
## 873 2 2 3 2
## 874 3 2 1 2
## 875 1 1 1 1
## 876 1 2 1 1
## 877 1 1 1 1
## 878 4 2 1 1
## 879 1 1 1 1
## 880 4 2 1 3
## 881 1 2 1 1
## 882 3 2 1 1
## 883 1 1 1 1
## 884 1 1 1 1
## 885 1 2 1 1
## 886 4 2 2 2
## 887 1 2 1 3
## 888 1 2 1 1
## 889 1 2 1 1
## 890 5 2 5 4
## 891 3 2 1 1
## 892 1 1 1 1
## 893 1 1 1 1
## 894 2 2 2 3
## 895 2 1 1 1
## 896 4 1 1 2
## 897 2 2 1 1
## 898 3 2 1 2
## 899 1 2 1 1
## 900 1 4 1 1
## 901 3 2 1 1
## 902 4 2 1 5
## 903 3 3 1 1
## 904 3 2 1 2
## 905 1 1 1 1
## 906 1 2 1 1
## 907 1 1 1 1
## 908 5 5 4 5
## 909 5 4 4 5
## 910 3 1 1 1
## 911 3 2 3 5
## 912 1 1 1 1
## 913 1 3 1 1
## 914 3 2 2 3
## 915 3 2 3 5
## 916 1 2 1 1
## 917 1 2 1 1
## 918 3 1 1 1
## 919 3 2 3 5
## 920 1 1 2 2
## 921 4 2 4 5
## 922 1 1 1 1
## 923 3 2 2 2
## 924 1 2 1 2
## 925 1 2 1 1
## 926 3 1 1 1
## 927 1 2 1 1
## 928 1 2 1 1
## 929 3 2 3 4
## 930 1 1 1 1
## 931 3 2 1 1
## 932 1 2 1 4
## 933 1 2 1 1
## 934 1 2 1 1
## 935 1 1 1 1
## 936 1 2 1 1
## 937 3 2 1 1
## 938 1 2 1 1
## 939 1 2 1 3
## 940 1 2 1 2
## 941 1 2 1 1
## 942 2 2 1 1
## 943 1 2 1 1
## 944 2 2 3 1
## 945 2 2 1 1
## 946 2 2 1 2
## 947 2 2 1 2
## 948 5 4 5 2
## 949 3 2 4 4
## 950 4 3 4 5
## 951 5 5 5 5
## 952 2 1 1 3
## 953 1 1 1 1
## 954 3 2 2 1
## 955 2 2 1 2
## 956 5 4 4 4
## 957 5 4 5 5
## 958 3 2 1 1
## 959 4 2 5 5
## 960 5 4 5 5
## 961 3 2 1 1
## 962 4 2 4 4
## 963 3 2 4 5
## 964 2 1 2 4
## 965 1 1 1 1
## 966 1 2 1 1
## 967 5 2 4 5
## 968 2 2 1 2
## 969 1 2 1 1
## 970 1 1 1 1
## 971 4 3 5 5
## 972 1 1 1 1
## 973 3 2 1 1
## 974 3 3 1 2
## 975 4 2 2 5
## 976 1 1 1 1
## 977 3 2 1 1
## 978 1 2 1 1
## 979 3 2 1 5
## 980 3 2 1 1
## 981 3 2 1 2
## 982 3 2 4 1
## 983 3 2 1 1
## 984 1 2 1 1
## 985 5 2 5 5
## 986 2 2 1 3
## 987 1 2 1 1
## 988 1 1 2 2
## 989 3 2 1 3
## 990 5 3 5 5
## 991 3 2 1 3
## 992 3 3 3 4
## 993 4 3 5 5
## 994 5 4 4 5
## 995 3 2 2 1
## 996 4 2 3 3
## 997 5 2 5 5
## 998 3 1 1 2
## 999 5 2 2 4
## 1000 2 2 1 4
## 1001 2 2 4 4
## 1002 1 1 1 1
## 1003 2 2 2 2
## 1004 4 3 1 1
## 1005 4 2 3 5
## 1006 4 2 5 5
## 1007 3 2 1 3
## 1008 3 2 1 2
## 1009 4 4 4 5
## 1010 2 2 1 2
## 1011 1 2 1 2
## 1012 3 2 1 2
## 1013 4 2 5 5
## 1014 1 2 1 1
## 1015 4 2 3 4
## 1016 3 1 1 3
## 1017 1 1 3 2
## 1018 1 2 1 1
## 1019 5 5 4 3
## 1020 1 2 1 1
## 1021 3 2 1 2
## 1022 2 1 1 2
## 1023 1 1 5 3
## 1024 1 2 1 4
## 1025 3 2 1 1
## 1026 5 2 5 5
## 1027 3 2 1 3
## 1028 4 3 2 3
## 1029 4 2 4 4
## 1030 3 2 2 3
## 1031 3 2 1 1
## 1032 3 2 3 2
## 1033 1 2 1 1
## 1034 3 2 1 2
## 1035 4 2 2 3
## 1036 2 2 3 5
## 1037 2 2 3 1
## 1038 4 4 3 4
## 1039 1 2 1 1
## 1040 2 2 1 4
## 1041 1 3 1 4
## 1042 2 2 1 1
## 1043 1 1 1 1
## 1044 4 2 4 5
## 1045 3 2 2 5
## 1046 2 2 1 1
## 1047 2 1 1 2
## 1048 3 2 1 1
## 1049 2 2 1 1
## 1050 1 1 1 1
## 1051 1 2 1 1
## 1052 3 2 3 2
## 1053 4 2 1 1
## 1054 5 2 5 5
## 1055 3 1 1 2
## 1056 2 2 1 2
## 1057 3 1 1 2
## 1058 3 2 4 4
## 1059 3 1 2 5
## 1060 4 2 5 5
## 1061 1 1 1 1
## 1062 3 2 1 1
## 1063 2 2 1 2
## 1064 5 4 5 5
## 1065 5 4 4 4
## 1066 1 1 1 1
## 1067 3 2 2 1
## 1068 1 1 1 1
## 1069 1 1 1 1
## 1070 1 2 1 1
## 1071 3 2 1 1
## 1072 4 2 1 1
## 1073 5 2 5 1
## 1074 5 2 2 1
## 1075 4 2 3 4
## 1076 3 2 2 4
## 1077 1 2 1 1
## 1078 1 1 1 1
## 1079 1 1 1 1
## 1080 4 2 4 3
## 1081 5 2 5 5
## 1082 3 2 3 3
## 1083 5 5 5 5
## 1084 2 2 1 1
## 1085 1 2 1 1
## 1086 5 3 3 3
## 1087 2 2 1 4
## 1088 3 2 1 1
## 1089 3 2 1 1
## 1090 3 2 2 2
## 1091 3 2 3 1
## 1092 1 2 1 1
## 1093 3 2 1 5
## 1094 1 2 1 1
## 1095 1 1 2 3
## 1096 1 2 1 1
## 1097 3 2 2 4
## 1098 4 2 2 4
## 1099 1 1 1 2
## 1100 1 2 1 1
## 1101 2 2 1 3
## 1102 5 5 5 5
## 1103 5 3 5 5
## 1104 2 1 1 1
## 1105 4 4 2 4
## 1106 4 4 4 4
## 1107 1 1 1 1
## 1108 3 2 3 1
## 1109 2 2 1 1
## 1110 2 1 1 1
## 1111 1 1 1 1
## 1112 4 2 4 4
## 1113 1 2 3 4
## 1114 5 2 2 5
## 1115 2 2 1 3
## 1116 5 2 4 4
## 1117 4 2 4 3
## 1118 4 4 4 5
## 1119 1 1 1 1
## 1120 4 3 3 5
## 1121 1 1 1 1
## 1122 4 3 3 3
## 1123 1 1 1 1
## 1124 1 2 1 2
## 1125 2 2 1 2
## 1126 1 2 1 1
## 1127 1 1 3 4
## 1128 1 2 1 1
## 1129 5 2 1 1
## 1130 2 2 2 1
## 1131 5 2 5 5
## 1132 3 2 1 1
## 1133 1 2 1 1
## 1134 5 5 5 5
## 1135 3 2 5 5
## 1136 1 2 1 1
## 1137 5 3 3 5
## 1138 5 4 4 5
## 1139 3 1 1 1
## 1140 3 2 2 4
## 1141 4 2 4 5
## 1142 2 1 1 1
## 1143 3 2 1 2
## 1144 1 1 1 1
## 1145 1 2 2 2
## 1146 2 1 2 2
## 1147 3 2 1 4
## 1148 1 2 1 2
## 1149 1 2 1 2
## 1150 3 2 1 1
## 1151 1 1 1 1
## 1152 1 2 1 5
## 1153 5 2 1 3
## 1154 1 1 1 1
## 1155 3 2 1 1
## 1156 1 2 2 3
## 1157 4 2 3 3
## 1158 3 1 4 2
## 1159 3 2 3 1
## 1160 5 4 5 5
## 1161 3 2 3 4
## 1162 2 2 3 2
## 1163 2 2 1 1
## 1164 3 3 5 4
## 1165 5 3 4 5
## 1166 5 3 4 5
## 1167 5 4 2 4
## 1168 1 1 1 3
## 1169 5 4 5 3
## 1170 1 1 3 4
## 1171 5 5 4 2
## 1172 3 2 1 3
## 1173 5 2 5 5
## 1174 3 4 4 5
## 1175 2 1 1 3
## 1176 3 2 2 4
## 1177 1 2 1 1
## 1178 4 3 4 4
## 1179 4 2 5 5
## 1180 4 2 4 5
## 1181 4 2 4 5
## 1182 1 2 3 2
## 1183 3 1 2 2
## 1184 5 5 5 5
## 1185 5 4 3 4
## 1186 5 2 5 5
## 1187 5 2 5 5
## 1188 5 2 5 5
## 1189 5 4 5 5
## 1190 2 1 1 4
## 1191 2 2 3 4
## 1192 5 2 3 5
## 1193 5 4 5 5
## 1194 3 2 1 2
## 1195 3 1 4 5
## 1196 5 4 5 5
## 1197 1 2 1 3
## 1198 5 4 5 4
## 1199 5 2 1 2
## 1200 1 1 1 2
## 1201 5 2 5 5
## 1202 1 2 2 5
## 1203 4 2 5 5
## 1204 2 1 2 3
## 1205 5 4 4 5
## 1206 1 2 1 1
## 1207 3 2 3 4
## 1208 5 2 5 5
## 1209 1 2 1 1
## 1210 3 3 4 5
## 1211 5 5 4 5
## 1212 3 1 4 3
## 1213 1 2 5 5
## 1214 5 2 5 5
## 1215 5 2 5 4
## 1216 5 2 5 5
## 1217 4 2 5 4
## 1218 4 2 2 5
## 1219 5 4 5 5
## 1220 4 2 3 5
## 1221 4 2 4 5
## 1222 3 3 4 3
## 1223 5 5 3 5
## 1224 3 2 2 1
## 1225 3 3 3 3
## 1226 4 3 3 5
## 1227 3 3 3 5
## 1228 3 2 1 4
## 1229 4 2 4 4
## 1230 5 2 5 1
## 1231 5 2 5 3
## 1232 5 4 5 5
## 1233 2 3 1 1
## 1234 5 5 5 5
## 1235 3 2 3 4
## 1236 2 1 1 2
## 1237 4 1 2 3
## 1238 5 2 5 5
## 1239 1 2 3 2
## 1240 5 4 5 5
## 1241 3 2 3 5
## 1242 4 3 4 5
## 1243 3 1 1 2
## 1244 2 2 1 3
## 1245 3 2 1 4
## 1246 4 3 3 4
## 1247 1 2 1 1
## 1248 3 1 5 3
## 1249 4 1 4 5
## 1250 1 1 2 1
## 1251 4 2 5 5
## 1252 5 2 5 5
## 1253 3 3 2 5
## 1254 1 3 4 4
## 1255 1 1 1 3
## 1256 4 2 3 5
## 1257 1 2 1 3
## 1258 2 2 2 1
## 1259 1 1 1 1
## 1260 5 3 3 4
## 1261 1 2 1 1
## 1262 5 5 2 4
## 1263 4 3 2 5
## 1264 5 3 3 5
## 1265 3 4 2 3
## 1266 2 2 4 2
## 1267 2 2 1 1
## 1268 3 2 3 5
## 1269 3 2 1 2
## 1270 3 2 1 3
## 1271 4 3 5 5
## 1272 2 2 1 2
## 1273 2 1 1 1
## 1274 4 3 3 3
## 1275 2 2 3 4
## 1276 4 2 4 4
## 1277 5 4 4 3
## 1278 5 3 4 5
## 1279 4 2 4 5
## 1280 5 3 4 5
## 1281 4 2 3 4
## 1282 1 2 1 1
## 1283 1 2 1 1
## 1284 3 3 3 5
## 1285 1 1 1 1
## 1286 4 2 3 5
## 1287 4 1 4 5
## 1288 2 1 3 5
## 1289 5 4 3 5
## 1290 1 1 1 1
## 1291 4 5 4 5
## 1292 1 2 1 2
## 1293 1 2 1 1
## 1294 4 3 3 5
## 1295 1 1 1 1
## 1296 1 2 1 1
## 1297 5 1 5 5
## 1298 3 2 4 4
## 1299 3 2 3 4
## 1300 4 3 4 4
## 1301 5 2 5 5
## 1302 5 2 3 5
## 1303 5 5 3 5
## 1304 4 4 3 5
## 1305 4 2 4 5
## 1306 5 3 5 5
## 1307 2 2 1 2
## 1308 4 3 4 4
## 1309 3 2 2 3
## 1310 2 2 1 2
## 1311 5 5 5 5
## 1312 4 3 2 3
## 1313 3 4 4 5
## 1314 4 4 4 5
## 1315 5 2 3 5
## 1316 4 2 4 4
## 1317 5 4 5 5
## 1318 4 2 4 5
## 1319 5 3 5 5
## 1320 4 2 4 5
## 1321 5 2 4 5
## 1322 1 1 2 1
## 1323 1 2 1 1
## 1324 4 1 3 4
## 1325 5 2 5 5
## 1326 5 5 5 5
## 1327 2 1 2 3
## 1328 5 3 4 3
## 1329 4 5 5 5
## 1330 3 3 4 5
## 1331 1 3 4 3
## 1332 4 2 4 5
## 1333 5 2 4 5
## 1334 3 2 3 3
## 1335 1 2 3 3
## 1336 2 2 3 4
## 1337 4 3 4 5
## 1338 3 2 3 5
## 1339 3 2 1 1
## 1340 5 2 5 5
## 1341 5 5 5 5
## 1342 5 2 3 5
## 1343 5 2 5 5
## 1344 2 2 1 1
## 1345 5 4 5 5
## 1346 5 4 5 5
## 1347 4 2 5 5
## 1348 3 2 1 1
## 1349 4 4 1 3
## 1350 5 2 4 5
## 1351 4 1 3 3
## 1352 1 2 4 4
## 1353 5 2 5 5
## 1354 4 2 1 1
## 1355 5 3 4 5
## 1356 3 2 3 5
## 1357 4 4 5 5
## 1358 1 1 1 3
## 1359 4 2 5 5
## 1360 4 1 2 4
## 1361 5 5 5 5
## 1362 4 3 3 5
## 1363 1 2 1 1
## 1364 1 1 1 1
## 1365 3 2 1 1
## 1366 3 2 3 4
## 1367 2 2 1 3
## 1368 3 2 1 1
## 1369 1 1 1 1
## 1370 3 4 4 5
## 1371 4 2 1 1
## 1372 2 1 1 1
## 1373 4 2 3 5
## 1374 3 2 4 5
## 1375 1 2 2 1
## 1376 2 1 1 2
## 1377 1 1 1 1
## 1378 3 2 2 3
## 1379 3 3 3 5
## 1380 1 2 1 1
## 1381 2 3 4 5
## 1382 1 2 1 1
## 1383 5 3 4 5
## 1384 4 2 4 4
## 1385 3 2 5 5
## 1386 3 3 1 1
## 1387 2 3 3 5
## 1388 1 2 1 1
## 1389 4 3 3 4
## 1390 1 2 1 1
## 1391 3 2 2 3
## 1392 3 2 1 1
## 1393 3 2 1 3
## 1394 1 2 1 4
## 1395 2 1 1 2
## 1396 4 3 5 5
## 1397 4 2 4 5
## 1398 3 2 4 4
## 1399 1 2 1 3
## 1400 2 1 1 2
## 1401 5 2 5 5
## 1402 5 2 4 5
## 1403 5 2 4 5
## 1404 3 1 3 1
## 1405 4 2 4 5
## 1406 5 4 2 5
## 1407 3 2 3 4
## 1408 4 2 1 1
## 1409 4 2 3 4
## 1410 5 2 5 5
## 1411 4 3 4 4
## 1412 1 2 1 1
## 1413 3 2 2 4
## 1414 5 2 1 5
## 1415 1 2 1 2
## 1416 1 1 2 2
## 1417 4 2 3 5
## 1418 3 1 1 5
## 1419 5 3 5 5
## 1420 1 1 1 1
## 1421 3 2 4 4
## 1422 3 2 4 5
## 1423 2 1 2 3
## 1424 1 2 3 4
## 1425 4 2 2 3
## 1426 2 2 1 3
## 1427 2 2 1 2
## 1428 4 1 2 5
## 1429 4 2 1 4
## 1430 3 2 3 3
## 1431 3 1 1 2
## 1432 1 1 1 4
## 1433 5 2 5 5
## 1434 3 2 1 1
## 1435 5 4 4 4
## 1436 5 2 5 5
## 1437 5 4 1 2
## 1438 4 2 5 5
## 1439 1 2 1 1
## 1440 2 2 1 1
## 1441 3 2 5 5
## 1442 1 2 5 5
## 1443 1 2 1 1
## 1444 1 1 3 2
## 1445 5 4 5 5
## 1446 1 2 1 2
## 1447 3 2 4 5
## 1448 5 4 3 4
## 1449 4 2 3 4
## 1450 5 4 5 5
## 1451 4 2 3 5
## 1452 3 2 1 1
## 1453 1 2 1 1
## 1454 5 4 1 3
## 1455 1 2 1 1
## 1456 3 2 1 2
## 1457 5 2 1 1
## 1458 4 2 4 1
## 1459 1 2 3 2
## 1460 4 2 5 5
## 1461 2 2 1 1
## 1462 5 4 5 3
## 1463 2 2 1 1
## 1464 5 2 4 5
## 1465 1 2 1 1
## 1466 1 2 1 1
## 1467 5 2 3 4
## 1468 4 2 3 5
## 1469 4 1 5 5
## 1470 5 2 5 5
## 1471 3 2 1 3
## 1472 1 1 3 2
## 1473 1 2 1 4
## 1474 2 2 5 5
## 1475 3 2 1 5
## 1476 3 2 4 4
## 1477 3 1 1 1
## 1478 1 1 2 4
## 1479 4 3 4 5
## 1480 3 1 2 5
## 1481 5 2 4 4
## 1482 1 2 1 4
## 1483 1 2 1 1
## 1484 4 2 3 5
## 1485 1 1 1 1
## 1486 4 2 3 3
## 1487 3 2 3 5
## 1488 1 1 1 1
## 1489 5 2 5 5
## 1490 3 2 4 4
## 1491 1 1 1 1
## 1492 4 3 4 5
## 1493 3 2 1 2
## 1494 1 2 1 1
## 1495 1 2 1 1
## 1496 3 2 1 1
## 1497 1 2 1 1
## 1498 1 2 1 1
## 1499 2 2 1 2
## 1500 1 2 1 1
## 1501 2 1 1 1
## 1502 2 1 5 3
## 1503 1 2 1 1
## 1504 3 1 1 1
## 1505 3 2 3 3
## 1506 1 2 1 1
## 1507 3 1 2 1
## 1508 1 2 1 1
## 1509 1 2 2 1
## 1510 4 2 3 3
## 1511 1 1 1 1
## 1512 5 2 5 5
## 1513 4 2 5 5
## 1514 1 2 1 1
## 1515 1 2 1 2
## 1516 4 3 4 4
## 1517 5 4 4 5
## 1518 4 4 4 4
## 1519 5 5 5 5
## 1520 2 1 3 3
## 1521 5 3 5 5
## 1522 4 4 4 4
## 1523 5 2 2 4
## 1524 1 1 1 2
## 1525 5 4 4 5
## 1526 3 2 2 2
## 1527 1 1 1 1
## 1528 4 2 4 5
## 1529 4 2 4 5
## 1530 2 2 1 1
## 1531 2 2 1 3
## 1532 5 3 4 5
## 1533 5 4 5 5
## 1534 5 3 3 5
## 1535 5 2 5 5
## 1536 5 2 5 5
## 1537 5 4 3 5
## 1538 1 1 1 3
## 1539 5 4 4 1
## 1540 5 2 5 5
## 1541 3 2 3 5
## 1542 3 2 1 1
## 1543 5 2 5 5
## 1544 1 2 1 1
## 1545 4 1 5 4
## 1546 3 2 1 1
## 1547 4 2 4 5
## 1548 1 2 5 5
## 1549 4 2 4 5
## 1550 3 2 2 2
## 1551 1 2 1 1
## 1552 5 5 5 5
## 1553 3 2 4 5
## 1554 2 2 1 2
## 1555 3 2 3 5
## 1556 2 2 1 3
## 1557 1 2 1 1
## 1558 5 5 5 5
## 1559 3 1 1 1
## 1560 1 2 1 1
## 1561 1 2 1 1
## 1562 2 1 1 1
## 1563 2 1 3 2
## 1564 4 2 5 5
## 1565 1 2 1 1
## 1566 5 2 4 5
## 1567 3 2 1 3
## 1568 2 2 2 3
## 1569 1 1 1 2
## 1570 5 2 3 5
## 1571 3 1 1 5
## 1572 4 2 2 4
## 1573 5 5 1 3
## 1574 5 5 1 5
## 1575 1 2 1 3
## 1576 2 1 1 1
## 1577 1 2 1 2
## 1578 3 2 1 3
## 1579 4 2 1 3
## 1580 5 1 1 5
## 1581 1 0 1 1
## 1582 3 0 1 1
## 1583 0 0 1 2
## 1584 4 1 1 3
## 1585 4 1 1 3
## 1586 4 0 1 5
## 1587 1 0 1 5
## 1588 4 0 1 4
## 1589 2 0 1 3
## 1590 5 4 1 5
## 1591 4 3 1 4
## 1592 4 0 1 5
## 1593 4 0 1 5
## 1594 4 0 1 5
## 1595 3 0 1 4
## 1596 3 4 1 4
## 1597 1 0 1 2
## 1598 1 2 1 3
## 1599 3 0 1 4
## 1600 4 0 1 5
## 1601 4 0 1 5
## 1602 2 2 1 3
## 1603 1 1 1 3
## 1604 4 0 1 3
## 1605 4 3 1 3
## 1606 5 0 1 4
## 1607 4 0 1 5
## 1608 2 3 1 4
## 1609 4 3 1 5
## 1610 1 1 1 1
## 1611 4 5 1 4
## 1612 4 3 1 5
## 1613 5 5 1 5
## 1614 1 3 1 2
## 1615 2 1 1 2
## 1616 2 1 1 3
## 1617 4 3 1 5
## 1618 4 4 1 5
## 1619 3 1 1 5
## 1620 4 0 1 5
## 1621 1 1 1 3
## 1622 3 0 1 4
## 1623 4 0 1 3
## 1624 4 1 1 2
## 1625 3 1 1 3
## 1626 3 3 1 4
## 1627 5 5 1 5
## 1628 2 0 1 2
## 1629 5 4 1 5
## 1630 5 0 1 4
## 1631 4 1 1 3
## 1632 4 0 1 5
## 1633 4 2 1 5
## 1634 5 0 1 5
## 1635 1 0 1 3
## 1636 3 3 1 2
## 1637 5 4 1 5
## 1638 4 3 1 5
## 1639 5 3 1 5
## 1640 5 4 1 5
## 1641 3 0 1 4
## 1642 3 3 1 5
## 1643 5 4 1 5
## 1644 3 0 1 4
## 1645 3 0 1 5
## 1646 4 2 1 2
## 1647 4 4 1 4
## 1648 4 4 1 5
## 1649 1 0 1 4
## 1650 2 3 1 1
## 1651 5 4 1 5
## 1652 2 0 1 4
## 1653 1 2 1 2
## 1654 1 0 1 2
## 1655 4 1 1 5
## 1656 0 0 1 5
## 1657 3 3 1 2
## 1658 5 4 1 5
## 1659 4 4 1 3
## 1660 3 0 1 4
## 1661 5 4 1 4
## 1662 4 4 1 5
## 1663 3 3 1 5
## 1664 2 0 1 3
## 1665 4 0 1 4
## 1666 0 0 1 1
## 1667 2 1 1 5
## 1668 4 0 1 4
## 1669 5 0 1 5
## 1670 1 1 1 1
## 1671 4 3 1 5
## 1672 3 3 1 3
## 1673 1 3 1 3
## 1674 4 4 1 5
## 1675 3 1 1 5
## 1676 4 0 1 5
## 1677 1 0 1 2
## 1678 3 2 1 5
## 1679 5 4 1 3
## 1680 4 0 1 5
## 1681 3 3 1 5
## 1682 3 2 1 5
## 1683 5 5 1 5
## 1684 5 4 1 4
## 1685 4 0 1 5
## 1686 5 3 1 5
## 1687 4 4 1 5
## 1688 4 3 1 4
## 1689 3 0 1 4
## 1690 3 3 1 4
## 1691 1 1 1 1
## 1692 4 3 1 5
## 1693 4 3 1 4
## 1694 4 0 1 5
## 1695 5 4 1 5
## 1696 4 0 1 5
## 1697 4 0 1 3
## 1698 5 3 1 4
## 1699 2 3 1 3
## 1700 5 4 1 5
## 1701 4 2 1 1
## 1702 5 4 1 5
## 1703 3 3 1 3
## 1704 5 4 1 5
## 1705 4 0 1 4
## 1706 3 0 1 4
## 1707 4 3 1 4
## 1708 4 3 1 4
## 1709 4 4 1 5
## 1710 5 4 1 5
## 1711 4 4 1 5
## 1712 4 3 1 5
## 1713 4 0 1 4
## 1714 4 0 1 2
## 1715 3 1 1 3
## 1716 5 0 1 5
## 1717 4 5 1 5
## 1718 4 0 1 5
## 1719 3 3 1 5
## 1720 2 2 1 5
## 1721 4 0 1 5
## 1722 4 0 1 5
## 1723 4 4 1 5
## 1724 5 5 1 4
## 1725 1 3 1 2
## 1726 4 4 1 3
## 1727 1 0 1 4
## 1728 3 0 1 4
## 1729 5 5 1 5
## 1730 5 3 1 5
## 1731 4 0 1 5
## 1732 5 4 1 5
## 1733 3 2 1 3
## 1734 5 0 1 4
## 1735 5 3 1 4
## 1736 1 0 1 3
## 1737 4 3 1 4
## 1738 5 4 1 5
## 1739 5 0 1 5
## 1740 4 4 1 4
## 1741 4 4 1 5
## 1742 3 0 1 1
## 1743 4 4 1 4
## 1744 1 1 1 3
## 1745 5 3 1 5
## 1746 4 3 1 5
## 1747 5 4 1 5
## 1748 4 3 1 5
## 1749 3 3 1 3
## 1750 1 1 1 1
## 1751 5 0 1 4
## 1752 3 3 1 4
## 1753 4 0 1 4
## 1754 1 4 1 3
## 1755 5 0 1 5
## 1756 2 2 1 4
## 1757 5 5 1 5
## 1758 2 2 1 4
## 1759 4 3 1 5
## 1760 4 3 1 5
## 1761 1 0 1 4
## 1762 4 0 1 3
## 1763 5 3 1 4
## 1764 4 3 1 4
## 1765 5 5 1 5
## 1766 3 2 1 5
## 1767 3 3 1 4
## 1768 2 4 1 4
## 1769 5 3 1 3
## 1770 4 0 1 5
## 1771 4 2 1 3
## 1772 4 4 1 4
## 1773 5 4 1 4
## 1774 3 3 1 4
## 1775 4 3 1 3
## 1776 2 0 1 1
## 1777 1 1 1 1
## 1778 4 4 1 4
## 1779 3 0 1 5
## 1780 5 4 1 5
## 1781 2 1 1 4
## 1782 2 1 1 2
## 1783 3 1 1 5
## 1784 2 3 1 2
## 1785 4 3 1 5
## 1786 4 3 1 4
## 1787 3 2 1 2
## 1788 5 0 1 5
## 1789 1 3 1 2
## 1790 5 0 1 5
## 1791 5 4 1 5
## 1792 4 0 1 4
## 1793 5 0 1 5
## 1794 3 2 1 3
## 1795 4 0 1 5
## 1796 5 5 1 5
## 1797 4 3 1 5
## 1798 5 4 1 5
## 1799 5 5 1 4
## 1800 4 3 1 2
## 1801 5 4 1 5
## 1802 5 3 1 5
## 1803 4 4 1 5
## 1804 3 0 1 4
## 1805 4 3 1 5
## 1806 2 2 1 3
## 1807 5 3 1 4
## 1808 5 0 1 5
## 1809 3 1 1 1
## 1810 5 3 1 5
## 1811 1 1 1 1
## 1812 3 1 1 2
## 1813 4 0 1 5
## 1814 4 3 1 3
## 1815 4 0 1 4
## 1816 4 4 1 5
## 1817 0 0 1 4
## 1818 4 0 1 5
## 1819 3 3 1 4
## 1820 5 1 1 4
## 1821 1 0 1 2
## 1822 5 5 1 5
## 1823 5 5 1 5
## 1824 4 2 1 5
## 1825 3 2 1 4
## 1826 4 0 1 5
## 1827 4 4 1 5
## 1828 1 0 1 2
## 1829 4 3 1 5
## 1830 4 0 1 4
## 1831 4 3 1 5
## 1832 3 0 1 1
## 1833 5 0 1 5
## 1834 5 3 1 3
## 1835 4 4 1 3
## 1836 4 3 1 5
## 1837 3 3 1 1
## 1838 1 2 1 2
## 1839 1 0 1 1
## 1840 4 3 1 5
## 1841 3 3 1 4
## 1842 2 0 1 2
## 1843 1 0 1 1
## 1844 2 1 1 1
## 1845 3 4 1 3
## 1846 1 0 1 3
## 1847 4 4 1 5
## 1848 2 1 1 3
## 1849 3 3 1 4
## 1850 5 2 1 3
## 1851 0 0 1 1
## 1852 4 3 1 2
## 1853 5 0 1 4
## 1854 4 1 1 4
## 1855 4 3 1 5
## 1856 4 3 1 4
## 1857 5 4 1 5
## 1858 5 4 1 5
## 1859 2 3 1 1
## 1860 5 4 1 5
## 1861 4 2 1 4
## 1862 3 3 1 5
## 1863 4 0 1 5
## 1864 4 4 1 4
## 1865 5 3 1 5
## 1866 4 3 1 4
## 1867 5 3 1 5
## 1868 5 5 1 5
## 1869 4 4 1 4
## 1870 3 3 1 4
## 1871 3 0 1 2
## 1872 4 3 1 4
## 1873 1 1 1 1
## 1874 4 0 1 4
## 1875 1 1 1 1
## 1876 5 0 1 5
## 1877 3 2 1 3
## 1878 4 1 1 4
## 1879 5 0 1 5
## 1880 4 0 1 4
## 1881 5 0 1 5
## 1882 3 3 1 4
## 1883 5 3 1 5
## 1884 3 0 1 3
## 1885 5 5 1 5
## 1886 5 3 1 5
## 1887 4 0 1 4
## 1888 4 3 1 5
## 1889 5 4 1 5
## 1890 5 3 1 4
## 1891 4 3 1 5
## 1892 5 5 1 5
## 1893 5 3 1 5
## 1894 3 0 1 2
## 1895 4 0 1 4
## 1896 4 3 1 5
## 1897 4 0 1 3
## 1898 4 0 1 4
## 1899 0 1 1 1
## 1900 3 3 1 5
## 1901 3 0 1 4
## 1902 4 4 1 4
## 1903 4 3 1 4
## 1904 4 3 1 5
## 1905 4 0 1 5
## 1906 4 1 1 5
## 1907 4 0 1 5
## 1908 4 3 1 4
## 1909 4 4 1 5
## 1910 5 5 1 5
## 1911 4 0 1 5
## 1912 1 0 1 4
## 1913 3 0 1 5
## 1914 1 2 1 2
## 1915 4 3 1 5
## 1916 5 3 1 5
## 1917 1 1 1 1
## 1918 4 3 1 3
## 1919 5 5 1 5
## 1920 5 4 1 5
## 1921 0 0 1 0
## 1922 1 1 1 1
## 1923 5 2 1 4
## 1924 4 4 1 5
## 1925 3 0 1 5
## 1926 4 2 1 2
## 1927 4 4 1 5
## 1928 4 3 1 5
## 1929 5 0 1 5
## 1930 4 4 1 4
## 1931 5 4 1 5
## 1932 1 1 1 5
## 1933 4 0 1 4
## 1934 4 4 1 4
## 1935 1 1 1 1
## 1936 4 0 1 4
## 1937 3 0 1 5
## 1938 4 2 1 5
## 1939 4 0 1 5
## 1940 5 5 1 5
## 1941 4 0 1 4
## 1942 5 4 1 5
## 1943 3 2 1 4
## 1944 4 4 1 5
## 1945 5 5 1 5
## 1946 4 3 1 5
## 1947 4 3 1 4
## 1948 5 4 1 5
## 1949 1 0 1 3
## 1950 5 3 1 5
## 1951 2 3 1 5
## 1952 5 4 1 5
## 1953 5 0 1 5
## 1954 5 0 1 4
## 1955 1 1 1 2
## 1956 3 0 1 1
## 1957 1 0 1 1
## 1958 3 0 1 4
## 1959 5 5 1 5
## 1960 5 3 1 5
## 1961 3 4 1 5
## 1962 3 3 1 5
## 1963 3 3 1 3
## 1964 2 1 1 4
## 1965 4 4 1 5
## 1966 5 4 1 5
## 1967 4 0 1 4
## 1968 2 3 1 3
## 1969 0 0 1 5
## 1970 5 2 1 5
## 1971 5 5 1 5
## 1972 1 1 1 0
## 1973 4 0 1 5
## 1974 5 3 1 5
## 1975 5 5 1 5
## 1976 1 1 1 4
## 1977 4 0 1 5
## 1978 4 0 1 3
## 1979 5 5 1 5
## 1980 5 4 1 5
## 1981 4 4 1 4
## 1982 2 0 1 4
## 1983 3 3 1 3
## 1984 5 4 1 5
## 1985 4 3 1 5
## 1986 4 4 1 4
## 1987 1 1 1 2
## 1988 5 4 1 5
## 1989 4 3 1 5
## 1990 3 1 1 4
## 1991 4 4 1 5
## 1992 4 0 1 5
## 1993 2 0 1 3
## 1994 4 3 1 5
## 1995 4 0 1 4
## 1996 5 4 1 4
## 1997 5 0 1 5
## 1998 5 4 1 5
## 1999 5 4 1 5
## 2000 2 1 1 3
## 2001 1 1 1 2
## 2002 5 5 1 5
## 2003 2 2 1 4
## 2004 4 4 1 5
## 2005 1 0 1 3
## 2006 5 0 1 5
## 2007 4 4 1 5
## 2008 1 1 1 1
## 2009 3 0 1 5
## 2010 5 0 1 5
## 2011 3 2 1 3
## 2012 5 0 1 3
## 2013 3 0 1 2
## 2014 4 3 1 4
## 2015 1 0 1 2
## 2016 1 0 1 2
## 2017 5 3 1 4
## 2018 1 0 1 1
## 2019 4 3 1 5
## 2020 2 2 1 2
## 2021 1 2 1 2
## 2022 3 3 1 2
## 2023 1 1 1 1
## 2024 4 3 1 4
## 2025 1 1 1 1
## 2026 1 0 1 0
## 2027 5 4 1 2
## 2028 2 3 1 5
## 2029 4 4 1 4
## 2030 4 3 1 3
## 2031 4 4 1 5
## 2032 5 3 1 5
## 2033 1 1 1 4
## 2034 5 0 1 4
## 2035 2 1 1 1
## 2036 1 0 1 4
## 2037 1 0 1 4
## 2038 5 4 1 5
## 2039 2 0 1 2
## 2040 5 4 1 4
## 2041 0 0 1 3
## 2042 5 0 1 4
## 2043 4 3 1 4
## 2044 2 1 1 2
## 2045 1 1 1 2
## 2046 1 1 1 2
## 2047 4 0 1 5
## 2048 5 4 1 4
## 2049 1 1 1 3
## 2050 3 3 1 4
## 2051 3 3 1 3
## 2052 2 2 1 1
## 2053 4 1 1 4
## 2054 1 3 1 1
## 2055 2 0 1 3
## 2056 4 1 1 4
## 2057 3 2 1 5
## 2058 3 0 1 2
## 2059 1 1 1 1
## 2060 1 1 1 1
## 2061 2 0 1 1
## 2062 1 1 1 1
## 2063 1 1 1 2
## 2064 2 0 1 1
## Recommended Inflight.Entertainment Wifi...Connectivity
## 1 yes 0 0
## 2 yes 0 0
## 3 yes 0 0
## 4 yes 0 0
## 5 yes 0 0
## 6 no 2 2
## 7 yes 0 0
## 8 no 0 0
## 9 no 0 0
## 10 yes 0 0
## 11 no 0 0
## 12 no 1 1
## 13 no 1 1
## 14 yes 0 0
## 15 no 0 0
## 16 yes 0 0
## 17 no 0 0
## 18 no 1 1
## 19 yes 0 0
## 20 no 0 0
## 21 no 0 0
## 22 no 0 0
## 23 no 0 0
## 24 yes 0 0
## 25 no 0 0
## 26 yes 0 0
## 27 no 0 0
## 28 no 0 0
## 29 no 0 0
## 30 yes 0 0
## 31 no 0 0
## 32 no 1 1
## 33 no 0 0
## 34 yes 0 0
## 35 no 1 1
## 36 no 0 0
## 37 no 0 0
## 38 no 2 0
## 39 no 1 1
## 40 yes 0 0
## 41 yes 0 0
## 42 no 1 1
## 43 no 1 0
## 44 no 0 0
## 45 no 0 0
## 46 no 0 0
## 47 yes 0 0
## 48 no 0 0
## 49 no 0 0
## 50 no 0 0
## 51 no 0 1
## 52 no 1 1
## 53 no 0 0
## 54 yes 0 0
## 55 no 0 0
## 56 no 0 0
## 57 yes 0 0
## 58 no 1 1
## 59 no 0 0
## 60 no 0 0
## 61 yes 0 0
## 62 no 0 0
## 63 yes 0 0
## 64 no 0 0
## 65 no 0 0
## 66 no 1 1
## 67 no 0 0
## 68 no 3 1
## 69 no 0 0
## 70 yes 0 0
## 71 no 0 0
## 72 no 0 0
## 73 yes 0 0
## 74 yes 0 0
## 75 no 0 0
## 76 no 0 0
## 77 no 0 0
## 78 no 0 0
## 79 yes 0 0
## 80 no 0 0
## 81 yes 0 0
## 82 no 1 1
## 83 no 0 0
## 84 no 0 0
## 85 no 0 0
## 86 no 0 0
## 87 yes 0 0
## 88 no 0 0
## 89 yes 0 0
## 90 yes 0 0
## 91 yes 0 0
## 92 no 1 1
## 93 yes 0 0
## 94 yes 0 0
## 95 no 1 1
## 96 yes 0 0
## 97 no 1 1
## 98 no 0 0
## 99 no 0 0
## 100 yes 0 0
## 101 yes 0 0
## 102 no 1 1
## 103 no 0 0
## 104 no 0 0
## 105 no 0 0
## 106 no 0 0
## 107 yes 0 0
## 108 no 0 0
## 109 no 0 0
## 110 no 0 0
## 111 no 0 0
## 112 yes 0 0
## 113 no 1 1
## 114 no 0 0
## 115 yes 0 0
## 116 yes 0 0
## 117 no 0 0
## 118 yes 0 0
## 119 no 0 0
## 120 yes 2 0
## 121 yes 0 0
## 122 no 1 1
## 123 yes 0 0
## 124 no 0 0
## 125 yes 0 0
## 126 no 0 0
## 127 no 1 1
## 128 no 1 1
## 129 no 0 0
## 130 no 0 0
## 131 yes 0 0
## 132 no 0 0
## 133 yes 0 0
## 134 no 0 0
## 135 no 0 0
## 136 no 0 0
## 137 yes 0 0
## 138 yes 0 0
## 139 no 1 1
## 140 no 0 0
## 141 no 1 0
## 142 no 0 0
## 143 no 0 0
## 144 no 0 0
## 145 yes 0 0
## 146 no 0 0
## 147 no 0 0
## 148 no 0 0
## 149 no 0 0
## 150 yes 0 0
## 151 no 0 0
## 152 no 2 1
## 153 no 1 1
## 154 yes 0 0
## 155 no 0 0
## 156 no 0 1
## 157 no 1 1
## 158 no 0 0
## 159 no 0 0
## 160 yes 0 0
## 161 no 1 1
## 162 no 0 0
## 163 no 1 1
## 164 no 0 0
## 165 yes 0 0
## 166 no 0 0
## 167 yes 0 0
## 168 no 0 0
## 169 no 0 0
## 170 no 0 0
## 171 no 0 0
## 172 no 0 0
## 173 no 0 0
## 174 no 0 0
## 175 no 0 0
## 176 no 1 1
## 177 no 0 0
## 178 yes 0 0
## 179 no 0 0
## 180 yes 0 0
## 181 no 1 1
## 182 no 0 0
## 183 no 0 0
## 184 yes 0 0
## 185 no 1 1
## 186 yes 0 0
## 187 yes 0 0
## 188 no 0 0
## 189 no 1 1
## 190 no 0 0
## 191 no 0 0
## 192 no 0 0
## 193 no 1 1
## 194 no 1 0
## 195 no 1 1
## 196 no 0 0
## 197 no 0 0
## 198 no 1 1
## 199 no 0 0
## 200 no 0 0
## 201 yes 0 0
## 202 yes 0 0
## 203 no 0 0
## 204 no 1 1
## 205 no 1 1
## 206 no 0 0
## 207 no 1 1
## 208 yes 1 0
## 209 yes 0 0
## 210 no 0 0
## 211 no 0 0
## 212 no 1 1
## 213 no 1 0
## 214 no 0 3
## 215 no 1 1
## 216 yes 0 0
## 217 no 0 0
## 218 yes 1 2
## 219 no 1 1
## 220 no 1 1
## 221 no 1 1
## 222 no 0 0
## 223 no 1 1
## 224 no 0 0
## 225 yes 0 0
## 226 no 1 1
## 227 yes 0 0
## 228 no 1 1
## 229 no 0 0
## 230 no 0 0
## 231 no 0 0
## 232 no 0 0
## 233 no 1 1
## 234 no 0 0
## 235 no 1 1
## 236 no 1 1
## 237 no 0 0
## 238 no 0 0
## 239 yes 0 0
## 240 no 1 0
## 241 no 0 0
## 242 yes 0 0
## 243 no 0 0
## 244 no 0 0
## 245 no 0 0
## 246 no 0 0
## 247 no 1 1
## 248 yes 0 0
## 249 yes 0 0
## 250 no 0 0
## 251 no 0 0
## 252 no 0 0
## 253 no 0 0
## 254 no 0 0
## 255 no 1 0
## 256 no 0 0
## 257 no 0 0
## 258 yes 0 0
## 259 no 1 1
## 260 no 0 0
## 261 yes 2 0
## 262 yes 0 0
## 263 no 0 0
## 264 no 0 0
## 265 no 0 0
## 266 no 0 0
## 267 no 0 0
## 268 no 0 0
## 269 no 0 0
## 270 no 0 0
## 271 no 0 0
## 272 yes 0 0
## 273 no 1 0
## 274 no 0 0
## 275 no 0 0
## 276 no 0 0
## 277 yes 0 0
## 278 no 0 0
## 279 yes 0 0
## 280 no 0 0
## 281 no 1 1
## 282 no 0 0
## 283 no 1 1
## 284 no 0 0
## 285 no 0 0
## 286 no 1 1
## 287 no 0 0
## 288 no 0 0
## 289 no 1 1
## 290 no 0 0
## 291 no 0 0
## 292 yes 0 0
## 293 no 0 0
## 294 no 0 0
## 295 no 0 0
## 296 no 0 0
## 297 yes 0 0
## 298 yes 0 0
## 299 no 0 0
## 300 no 0 0
## 301 yes 0 0
## 302 no 1 1
## 303 yes 0 0
## 304 no 0 0
## 305 no 0 0
## 306 no 0 0
## 307 no 0 0
## 308 no 0 0
## 309 no 0 0
## 310 no 0 0
## 311 yes 0 0
## 312 no 0 0
## 313 no 0 0
## 314 yes 0 0
## 315 yes 0 0
## 316 no 0 0
## 317 no 0 0
## 318 no 0 0
## 319 no 0 0
## 320 no 0 0
## 321 yes 0 0
## 322 no 1 1
## 323 no 0 0
## 324 no 0 0
## 325 no 0 0
## 326 no 0 0
## 327 no 0 0
## 328 no 0 0
## 329 yes 0 0
## 330 no 0 0
## 331 no 0 0
## 332 no 0 0
## 333 yes 0 0
## 334 no 0 0
## 335 no 0 0
## 336 yes 0 0
## 337 yes 0 0
## 338 yes 2 3
## 339 yes 0 0
## 340 no 0 0
## 341 no 0 0
## 342 no 0 0
## 343 no 0 0
## 344 no 0 0
## 345 no 0 0
## 346 no 0 0
## 347 no 0 0
## 348 no 0 0
## 349 no 0 0
## 350 yes 0 0
## 351 no 0 0
## 352 no 0 0
## 353 yes 0 0
## 354 no 0 0
## 355 no 0 0
## 356 yes 1 1
## 357 no 0 0
## 358 no 0 0
## 359 no 0 0
## 360 yes 0 0
## 361 no 0 0
## 362 no 0 0
## 363 no 0 0
## 364 no 0 0
## 365 no 0 0
## 366 yes 0 0
## 367 no 0 0
## 368 no 0 0
## 369 no 1 1
## 370 yes 0 0
## 371 no 1 0
## 372 yes 0 0
## 373 yes 0 0
## 374 no 0 0
## 375 no 0 0
## 376 no 1 0
## 377 no 0 0
## 378 no 0 0
## 379 yes 0 0
## 380 yes 0 0
## 381 yes 0 0
## 382 yes 0 0
## 383 no 1 1
## 384 yes 0 0
## 385 no 1 1
## 386 no 0 0
## 387 no 0 0
## 388 yes 0 0
## 389 no 0 0
## 390 yes 0 0
## 391 no 0 0
## 392 no 1 1
## 393 no 1 1
## 394 no 1 1
## 395 no 1 1
## 396 yes 0 0
## 397 yes 0 0
## 398 no 0 0
## 399 no 0 0
## 400 no 0 0
## 401 no 0 0
## 402 no 0 0
## 403 yes 0 0
## 404 no 0 0
## 405 no 1 1
## 406 no 0 0
## 407 no 0 0
## 408 no 0 0
## 409 no 0 0
## 410 no 1 0
## 411 no 0 0
## 412 no 0 0
## 413 no 0 0
## 414 no 1 1
## 415 no 1 1
## 416 no 1 1
## 417 no 1 1
## 418 no 0 0
## 419 no 0 0
## 420 no 0 0
## 421 no 0 0
## 422 no 0 0
## 423 no 0 0
## 424 no 0 0
## 425 no 1 0
## 426 no 2 2
## 427 yes 0 0
## 428 yes 0 0
## 429 no 0 0
## 430 no 0 0
## 431 no 0 0
## 432 no 0 0
## 433 no 0 0
## 434 no 0 0
## 435 no 0 0
## 436 yes 0 0
## 437 yes 0 0
## 438 no 0 0
## 439 no 1 1
## 440 no 0 0
## 441 no 0 0
## 442 no 0 0
## 443 no 0 0
## 444 no 0 0
## 445 no 1 0
## 446 no 1 1
## 447 no 0 0
## 448 no 0 0
## 449 no 1 1
## 450 no 0 0
## 451 no 0 0
## 452 no 0 0
## 453 yes 0 0
## 454 yes 0 0
## 455 no 0 0
## 456 no 0 0
## 457 no 1 1
## 458 yes 0 0
## 459 no 0 0
## 460 no 0 0
## 461 no 0 0
## 462 no 0 0
## 463 no 0 0
## 464 no 0 0
## 465 no 0 0
## 466 no 1 2
## 467 yes 0 0
## 468 no 0 0
## 469 no 0 0
## 470 no 0 0
## 471 no 1 1
## 472 yes 0 5
## 473 no 0 0
## 474 no 0 0
## 475 no 0 0
## 476 no 0 0
## 477 yes 0 0
## 478 no 0 0
## 479 no 1 1
## 480 no 0 0
## 481 no 0 0
## 482 no 1 0
## 483 no 0 0
## 484 no 1 1
## 485 no 0 0
## 486 no 1 1
## 487 no 1 1
## 488 no 1 1
## 489 no 0 0
## 490 no 0 0
## 491 no 1 1
## 492 no 1 0
## 493 no 0 0
## 494 no 0 0
## 495 no 2 0
## 496 no 1 1
## 497 no 0 0
## 498 no 0 0
## 499 no 0 0
## 500 no 0 0
## 501 no 0 0
## 502 no 0 0
## 503 yes 0 0
## 504 no 0 0
## 505 yes 0 0
## 506 no 1 1
## 507 no 0 0
## 508 yes 5 5
## 509 no 0 0
## 510 no 0 0
## 511 no 0 1
## 512 no 1 1
## 513 no 0 0
## 514 yes 0 0
## 515 yes 0 0
## 516 no 1 1
## 517 yes 0 0
## 518 no 1 1
## 519 no 0 0
## 520 no 0 0
## 521 no 1 0
## 522 yes 0 0
## 523 no 0 0
## 524 no 1 1
## 525 no 1 1
## 526 yes 0 0
## 527 no 0 0
## 528 no 0 0
## 529 no 0 0
## 530 no 0 0
## 531 no 0 0
## 532 no 1 0
## 533 no 0 0
## 534 no 0 0
## 535 yes 0 0
## 536 no 0 0
## 537 no 0 0
## 538 no 0 0
## 539 no 1 1
## 540 no 1 1
## 541 no 1 1
## 542 no 0 0
## 543 no 0 0
## 544 no 0 0
## 545 no 1 1
## 546 no 1 1
## 547 no 0 0
## 548 no 0 0
## 549 no 1 1
## 550 no 0 0
## 551 no 0 0
## 552 no 0 0
## 553 no 1 1
## 554 no 1 1
## 555 no 0 0
## 556 no 0 0
## 557 yes 2 2
## 558 no 0 0
## 559 no 0 0
## 560 no 0 0
## 561 no 0 0
## 562 no 0 0
## 563 no 0 0
## 564 yes 0 0
## 565 yes 0 0
## 566 no 0 0
## 567 no 1 1
## 568 no 0 0
## 569 no 1 0
## 570 no 0 0
## 571 no 0 0
## 572 no 0 0
## 573 no 0 1
## 574 no 0 0
## 575 no 0 0
## 576 no 0 0
## 577 no 1 1
## 578 no 0 0
## 579 no 0 0
## 580 yes 0 0
## 581 no 0 0
## 582 no 0 0
## 583 yes 0 0
## 584 yes 0 0
## 585 no 0 1
## 586 yes 0 0
## 587 no 2 1
## 588 no 0 0
## 589 no 1 1
## 590 yes 0 0
## 591 yes 0 0
## 592 yes 0 0
## 593 no 0 0
## 594 no 0 0
## 595 yes 0 0
## 596 no 0 0
## 597 no 0 0
## 598 no 1 0
## 599 no 0 0
## 600 no 0 0
## 601 no 0 0
## 602 no 1 1
## 603 no 0 0
## 604 no 1 1
## 605 no 1 1
## 606 no 0 0
## 607 no 0 0
## 608 yes 0 0
## 609 yes 0 0
## 610 no 0 0
## 611 no 0 0
## 612 no 0 0
## 613 no 0 0
## 614 no 0 0
## 615 no 0 0
## 616 no 1 1
## 617 no 0 0
## 618 no 1 1
## 619 no 0 0
## 620 no 0 0
## 621 no 0 0
## 622 yes 0 0
## 623 no 0 0
## 624 yes 1 0
## 625 no 0 0
## 626 no 0 0
## 627 no 0 0
## 628 no 0 0
## 629 no 0 0
## 630 yes 0 0
## 631 yes 0 0
## 632 yes 0 0
## 633 yes 0 0
## 634 no 0 0
## 635 no 0 0
## 636 no 0 0
## 637 yes 0 0
## 638 no 0 0
## 639 no 0 0
## 640 no 0 0
## 641 yes 0 0
## 642 no 0 0
## 643 no 0 0
## 644 no 1 1
## 645 no 1 1
## 646 no 0 1
## 647 no 0 0
## 648 no 1 0
## 649 no 0 0
## 650 yes 0 0
## 651 no 1 0
## 652 yes 0 0
## 653 no 0 0
## 654 yes 0 0
## 655 yes 0 0
## 656 no 0 0
## 657 no 0 0
## 658 yes 0 0
## 659 no 0 0
## 660 yes 0 0
## 661 no 1 1
## 662 no 1 1
## 663 no 0 0
## 664 no 0 0
## 665 no 0 0
## 666 no 0 0
## 667 no 0 0
## 668 no 0 0
## 669 yes 0 0
## 670 no 0 0
## 671 no 0 0
## 672 no 1 0
## 673 no 0 0
## 674 no 1 1
## 675 yes 0 0
## 676 no 0 0
## 677 no 0 0
## 678 no 4 4
## 679 no 1 1
## 680 no 1 1
## 681 no 0 0
## 682 no 0 0
## 683 yes 0 0
## 684 no 2 3
## 685 no 0 0
## 686 no 0 0
## 687 no 0 0
## 688 no 0 0
## 689 no 1 1
## 690 no 1 1
## 691 yes 0 0
## 692 no 0 0
## 693 no 0 0
## 694 no 0 0
## 695 no 1 1
## 696 no 0 0
## 697 no 0 0
## 698 no 1 1
## 699 yes 0 0
## 700 no 0 0
## 701 yes 0 0
## 702 no 1 1
## 703 no 0 0
## 704 no 0 0
## 705 yes 0 0
## 706 no 0 0
## 707 no 1 1
## 708 yes 0 0
## 709 no 1 1
## 710 no 0 0
## 711 yes 0 0
## 712 yes 0 0
## 713 no 0 0
## 714 no 0 0
## 715 no 0 0
## 716 no 0 0
## 717 no 1 1
## 718 yes 0 0
## 719 yes 0 0
## 720 no 0 0
## 721 yes 0 0
## 722 no 1 0
## 723 yes 0 0
## 724 no 0 0
## 725 no 0 0
## 726 no 1 1
## 727 no 0 0
## 728 yes 0 0
## 729 yes 0 0
## 730 no 3 0
## 731 yes 0 0
## 732 yes 0 0
## 733 yes 0 0
## 734 no 0 0
## 735 no 1 1
## 736 no 0 0
## 737 yes 0 0
## 738 yes 0 0
## 739 no 1 1
## 740 no 0 0
## 741 no 0 0
## 742 no 1 1
## 743 no 0 0
## 744 no 0 0
## 745 no 0 0
## 746 no 0 0
## 747 yes 1 1
## 748 no 1 0
## 749 yes 0 0
## 750 yes 0 0
## 751 no 1 1
## 752 no 0 0
## 753 no 1 1
## 754 yes 0 0
## 755 no 2 2
## 756 no 1 1
## 757 no 1 0
## 758 no 0 0
## 759 no 0 0
## 760 no 1 0
## 761 no 1 1
## 762 no 1 1
## 763 no 0 0
## 764 no 0 0
## 765 no 0 0
## 766 no 1 1
## 767 yes 0 0
## 768 no 0 0
## 769 no 0 0
## 770 no 1 1
## 771 no 1 1
## 772 no 0 0
## 773 no 1 1
## 774 no 0 0
## 775 no 0 0
## 776 no 0 0
## 777 yes 0 0
## 778 yes 0 0
## 779 no 0 0
## 780 no 0 0
## 781 yes 0 0
## 782 no 0 0
## 783 no 0 0
## 784 yes 0 0
## 785 no 0 0
## 786 no 1 1
## 787 no 0 0
## 788 no 0 0
## 789 no 0 0
## 790 yes 0 0
## 791 no 0 0
## 792 no 1 1
## 793 no 1 1
## 794 yes 0 0
## 795 no 0 0
## 796 no 0 0
## 797 yes 0 0
## 798 yes 0 0
## 799 no 0 0
## 800 yes 0 0
## 801 yes 0 0
## 802 no 0 1
## 803 no 0 0
## 804 no 1 1
## 805 no 0 0
## 806 no 1 1
## 807 yes 1 0
## 808 no 1 1
## 809 no 1 1
## 810 no 0 0
## 811 no 0 0
## 812 yes 0 0
## 813 yes 0 0
## 814 yes 1 1
## 815 no 1 1
## 816 yes 0 0
## 817 no 0 0
## 818 no 0 1
## 819 yes 0 0
## 820 no 1 1
## 821 no 0 0
## 822 no 0 0
## 823 no 0 0
## 824 no 0 0
## 825 no 0 0
## 826 no 0 0
## 827 no 1 1
## 828 no 0 0
## 829 no 1 1
## 830 yes 0 0
## 831 no 1 1
## 832 no 0 0
## 833 no 0 0
## 834 no 0 0
## 835 no 1 1
## 836 no 0 0
## 837 no 0 0
## 838 yes 0 0
## 839 no 0 0
## 840 no 1 1
## 841 no 0 0
## 842 yes 0 0
## 843 yes 0 0
## 844 yes 0 0
## 845 yes 0 0
## 846 no 0 0
## 847 no 0 0
## 848 no 0 0
## 849 no 0 0
## 850 no 0 0
## 851 no 0 0
## 852 yes 0 0
## 853 no 0 0
## 854 yes 4 0
## 855 no 0 0
## 856 no 0 0
## 857 no 0 0
## 858 no 0 0
## 859 no 0 0
## 860 no 0 0
## 861 no 0 0
## 862 no 1 1
## 863 no 1 1
## 864 no 0 0
## 865 no 0 0
## 866 no 0 0
## 867 yes 0 0
## 868 no 0 0
## 869 no 0 0
## 870 yes 0 0
## 871 no 0 0
## 872 no 1 0
## 873 no 0 0
## 874 no 0 0
## 875 no 1 1
## 876 no 0 0
## 877 no 0 0
## 878 no 0 0
## 879 no 1 1
## 880 no 0 0
## 881 no 0 0
## 882 no 0 0
## 883 no 1 1
## 884 no 0 0
## 885 no 0 0
## 886 no 1 0
## 887 no 0 0
## 888 no 0 0
## 889 no 0 0
## 890 yes 0 0
## 891 no 0 0
## 892 no 1 1
## 893 no 1 1
## 894 no 0 0
## 895 no 1 1
## 896 no 1 1
## 897 no 0 0
## 898 no 0 0
## 899 no 0 0
## 900 no 3 3
## 901 no 0 0
## 902 yes 0 0
## 903 no 0 0
## 904 no 0 0
## 905 no 0 0
## 906 no 0 0
## 907 no 1 1
## 908 yes 0 0
## 909 yes 0 0
## 910 no 1 1
## 911 yes 0 0
## 912 no 1 1
## 913 no 1 1
## 914 no 2 0
## 915 no 0 0
## 916 no 0 0
## 917 no 0 0
## 918 no 1 0
## 919 yes 0 0
## 920 no 1 1
## 921 yes 0 0
## 922 no 0 0
## 923 no 1 1
## 924 no 1 0
## 925 no 0 0
## 926 no 0 0
## 927 no 0 0
## 928 no 0 0
## 929 yes 0 0
## 930 no 0 0
## 931 no 0 0
## 932 no 0 0
## 933 no 0 0
## 934 no 0 0
## 935 no 1 1
## 936 no 0 0
## 937 no 0 0
## 938 no 0 0
## 939 no 0 0
## 940 no 0 0
## 941 no 0 0
## 942 no 1 1
## 943 no 0 0
## 944 no 0 0
## 945 no 0 0
## 946 no 0 0
## 947 no 1 0
## 948 no 1 0
## 949 yes 0 0
## 950 yes 0 0
## 951 yes 0 0
## 952 no 0 0
## 953 no 1 1
## 954 no 0 0
## 955 no 0 0
## 956 yes 0 0
## 957 yes 0 0
## 958 no 0 0
## 959 yes 0 0
## 960 yes 0 0
## 961 no 0 0
## 962 yes 0 0
## 963 yes 0 0
## 964 no 1 1
## 965 no 0 0
## 966 no 0 0
## 967 yes 0 0
## 968 no 0 0
## 969 no 0 0
## 970 no 0 0
## 971 yes 0 0
## 972 no 0 0
## 973 no 0 0
## 974 no 0 0
## 975 yes 0 0
## 976 no 1 1
## 977 no 0 0
## 978 no 0 0
## 979 yes 0 0
## 980 no 0 0
## 981 no 0 0
## 982 no 0 0
## 983 no 0 0
## 984 no 0 0
## 985 yes 0 0
## 986 no 0 0
## 987 no 0 0
## 988 no 0 0
## 989 no 0 0
## 990 yes 0 0
## 991 no 0 0
## 992 yes 0 0
## 993 yes 0 0
## 994 yes 0 0
## 995 no 0 0
## 996 yes 0 0
## 997 yes 0 0
## 998 no 1 1
## 999 yes 0 0
## 1000 no 0 0
## 1001 yes 0 0
## 1002 no 1 1
## 1003 no 0 0
## 1004 no 0 0
## 1005 yes 0 0
## 1006 yes 0 0
## 1007 no 2 0
## 1008 no 0 0
## 1009 yes 0 0
## 1010 no 0 0
## 1011 no 0 0
## 1012 no 1 1
## 1013 yes 0 0
## 1014 no 0 0
## 1015 yes 0 0
## 1016 no 1 0
## 1017 no 3 1
## 1018 no 0 0
## 1019 yes 0 0
## 1020 no 0 0
## 1021 no 0 0
## 1022 no 0 0
## 1023 no 0 0
## 1024 no 0 0
## 1025 no 0 0
## 1026 yes 0 0
## 1027 no 1 0
## 1028 no 1 0
## 1029 yes 0 0
## 1030 yes 0 0
## 1031 no 0 0
## 1032 no 0 0
## 1033 no 0 1
## 1034 no 0 0
## 1035 yes 0 0
## 1036 yes 0 0
## 1037 no 0 0
## 1038 yes 0 0
## 1039 no 0 0
## 1040 no 0 0
## 1041 no 0 0
## 1042 no 0 0
## 1043 no 1 1
## 1044 yes 0 0
## 1045 yes 0 0
## 1046 no 0 0
## 1047 no 1 1
## 1048 no 0 0
## 1049 no 0 0
## 1050 no 1 1
## 1051 no 0 0
## 1052 no 0 0
## 1053 no 0 0
## 1054 yes 0 0
## 1055 no 1 0
## 1056 no 0 0
## 1057 no 1 1
## 1058 yes 0 0
## 1059 yes 1 1
## 1060 yes 0 0
## 1061 no 1 1
## 1062 no 0 0
## 1063 no 1 0
## 1064 yes 0 0
## 1065 yes 0 0
## 1066 no 1 1
## 1067 no 0 0
## 1068 no 1 1
## 1069 no 0 0
## 1070 no 0 0
## 1071 no 0 0
## 1072 no 0 0
## 1073 no 0 0
## 1074 no 0 0
## 1075 yes 1 0
## 1076 yes 0 0
## 1077 no 0 0
## 1078 no 0 0
## 1079 no 1 1
## 1080 no 0 0
## 1081 yes 0 0
## 1082 yes 0 0
## 1083 yes 0 0
## 1084 no 0 0
## 1085 no 0 0
## 1086 no 1 0
## 1087 no 0 0
## 1088 no 0 0
## 1089 no 0 1
## 1090 no 0 0
## 1091 no 0 0
## 1092 no 0 0
## 1093 yes 0 0
## 1094 no 0 0
## 1095 no 0 0
## 1096 no 0 0
## 1097 yes 0 0
## 1098 no 0 0
## 1099 no 1 0
## 1100 no 0 0
## 1101 no 0 0
## 1102 yes 0 0
## 1103 yes 0 0
## 1104 no 1 1
## 1105 yes 0 0
## 1106 yes 0 0
## 1107 no 0 0
## 1108 no 0 0
## 1109 no 0 0
## 1110 no 0 0
## 1111 no 0 0
## 1112 yes 0 0
## 1113 yes 1 0
## 1114 yes 0 0
## 1115 no 0 0
## 1116 yes 0 0
## 1117 yes 0 0
## 1118 yes 0 0
## 1119 no 0 0
## 1120 yes 0 0
## 1121 no 0 0
## 1122 yes 0 0
## 1123 no 1 1
## 1124 no 0 0
## 1125 no 1 1
## 1126 no 0 0
## 1127 no 1 1
## 1128 no 0 0
## 1129 no 0 0
## 1130 no 0 0
## 1131 yes 0 0
## 1132 no 0 0
## 1133 no 0 0
## 1134 yes 0 0
## 1135 yes 0 0
## 1136 no 0 0
## 1137 yes 1 1
## 1138 yes 0 1
## 1139 no 1 1
## 1140 yes 0 0
## 1141 yes 0 0
## 1142 no 1 1
## 1143 no 0 0
## 1144 no 1 1
## 1145 no 0 0
## 1146 no 1 1
## 1147 no 1 0
## 1148 no 0 0
## 1149 no 0 0
## 1150 no 0 0
## 1151 no 1 1
## 1152 yes 0 0
## 1153 no 0 0
## 1154 no 1 0
## 1155 no 0 0
## 1156 no 0 0
## 1157 yes 1 0
## 1158 no 1 0
## 1159 no 1 1
## 1160 yes 0 0
## 1161 yes 0 0
## 1162 no 0 0
## 1163 no 0 0
## 1164 yes 0 0
## 1165 yes 0 0
## 1166 yes 0 0
## 1167 yes 0 0
## 1168 no 1 1
## 1169 yes 0 0
## 1170 yes 1 0
## 1171 yes 0 0
## 1172 no 0 0
## 1173 yes 0 0
## 1174 yes 0 0
## 1175 no 0 0
## 1176 yes 0 0
## 1177 no 0 0
## 1178 yes 0 0
## 1179 yes 0 0
## 1180 yes 0 0
## 1181 yes 0 0
## 1182 no 0 0
## 1183 no 1 1
## 1184 yes 0 0
## 1185 yes 0 0
## 1186 yes 0 0
## 1187 yes 0 0
## 1188 yes 0 0
## 1189 yes 0 0
## 1190 yes 0 0
## 1191 yes 0 0
## 1192 yes 0 0
## 1193 yes 0 0
## 1194 no 1 3
## 1195 yes 0 0
## 1196 yes 0 0
## 1197 no 0 0
## 1198 yes 0 0
## 1199 no 0 0
## 1200 no 0 0
## 1201 yes 0 0
## 1202 no 1 1
## 1203 yes 0 0
## 1204 no 1 1
## 1205 yes 0 0
## 1206 no 1 1
## 1207 yes 0 0
## 1208 yes 0 0
## 1209 no 0 0
## 1210 yes 0 0
## 1211 yes 0 0
## 1212 yes 0 0
## 1213 yes 0 0
## 1214 yes 0 0
## 1215 yes 0 0
## 1216 yes 0 0
## 1217 yes 0 0
## 1218 yes 0 0
## 1219 yes 0 0
## 1220 yes 0 0
## 1221 yes 0 0
## 1222 yes 0 0
## 1223 yes 0 0
## 1224 no 0 0
## 1225 yes 0 0
## 1226 yes 0 0
## 1227 yes 0 0
## 1228 yes 0 0
## 1229 yes 0 0
## 1230 yes 0 0
## 1231 yes 0 0
## 1232 yes 0 0
## 1233 no 0 0
## 1234 yes 0 0
## 1235 yes 0 0
## 1236 no 1 1
## 1237 no 1 1
## 1238 yes 0 0
## 1239 yes 0 0
## 1240 yes 0 0
## 1241 yes 0 0
## 1242 yes 0 0
## 1243 no 0 0
## 1244 no 0 0
## 1245 no 0 0
## 1246 yes 0 0
## 1247 no 0 0
## 1248 no 1 1
## 1249 yes 1 1
## 1250 no 0 1
## 1251 yes 0 0
## 1252 yes 0 0
## 1253 yes 0 0
## 1254 yes 0 0
## 1255 no 0 0
## 1256 yes 0 0
## 1257 no 1 1
## 1258 no 0 0
## 1259 no 1 1
## 1260 yes 0 0
## 1261 no 0 0
## 1262 yes 0 0
## 1263 no 1 1
## 1264 yes 0 0
## 1265 no 0 0
## 1266 yes 0 0
## 1267 no 1 1
## 1268 yes 0 0
## 1269 no 0 0
## 1270 no 0 0
## 1271 yes 1 1
## 1272 no 0 0
## 1273 no 1 1
## 1274 yes 0 0
## 1275 yes 0 0
## 1276 yes 0 0
## 1277 yes 0 0
## 1278 yes 2 0
## 1279 yes 0 0
## 1280 yes 2 1
## 1281 yes 2 0
## 1282 no 1 0
## 1283 no 0 0
## 1284 yes 0 0
## 1285 no 1 1
## 1286 yes 0 0
## 1287 yes 0 0
## 1288 yes 0 0
## 1289 yes 0 0
## 1290 no 0 0
## 1291 yes 0 0
## 1292 no 1 0
## 1293 no 0 0
## 1294 yes 0 0
## 1295 no 0 0
## 1296 no 0 0
## 1297 yes 0 0
## 1298 yes 0 0
## 1299 yes 0 0
## 1300 yes 0 0
## 1301 yes 0 0
## 1302 yes 0 0
## 1303 yes 5 0
## 1304 yes 0 0
## 1305 yes 0 0
## 1306 yes 0 0
## 1307 no 1 0
## 1308 yes 0 0
## 1309 no 0 0
## 1310 no 0 0
## 1311 yes 0 0
## 1312 no 0 0
## 1313 yes 0 0
## 1314 yes 0 0
## 1315 yes 0 0
## 1316 yes 0 0
## 1317 yes 2 0
## 1318 yes 0 0
## 1319 yes 0 0
## 1320 yes 0 0
## 1321 yes 0 0
## 1322 no 0 0
## 1323 no 0 0
## 1324 no 0 0
## 1325 yes 0 0
## 1326 yes 0 0
## 1327 no 0 0
## 1328 yes 0 0
## 1329 yes 0 0
## 1330 yes 0 0
## 1331 no 0 0
## 1332 yes 0 0
## 1333 yes 0 0
## 1334 no 0 0
## 1335 no 0 0
## 1336 yes 0 0
## 1337 yes 0 0
## 1338 yes 1 1
## 1339 no 0 0
## 1340 yes 0 0
## 1341 yes 0 0
## 1342 yes 0 0
## 1343 yes 0 0
## 1344 no 1 0
## 1345 yes 0 0
## 1346 yes 0 0
## 1347 yes 0 0
## 1348 no 0 0
## 1349 no 0 0
## 1350 yes 0 0
## 1351 yes 1 0
## 1352 yes 0 0
## 1353 yes 0 0
## 1354 no 0 0
## 1355 yes 2 0
## 1356 yes 0 0
## 1357 yes 0 0
## 1358 no 0 0
## 1359 yes 0 0
## 1360 yes 0 0
## 1361 yes 0 0
## 1362 yes 3 0
## 1363 no 0 0
## 1364 no 1 0
## 1365 no 0 0
## 1366 yes 0 0
## 1367 no 0 0
## 1368 no 0 0
## 1369 no 0 0
## 1370 yes 0 0
## 1371 no 0 0
## 1372 no 0 0
## 1373 yes 0 0
## 1374 yes 0 0
## 1375 no 0 0
## 1376 no 1 0
## 1377 no 1 1
## 1378 yes 0 0
## 1379 yes 0 0
## 1380 no 0 0
## 1381 yes 0 0
## 1382 no 0 0
## 1383 yes 0 0
## 1384 yes 0 0
## 1385 yes 0 0
## 1386 no 3 2
## 1387 yes 0 0
## 1388 no 0 0
## 1389 yes 0 0
## 1390 no 0 0
## 1391 no 0 0
## 1392 no 0 0
## 1393 no 0 0
## 1394 no 0 0
## 1395 no 1 1
## 1396 yes 0 0
## 1397 yes 0 0
## 1398 no 0 0
## 1399 no 0 0
## 1400 no 0 0
## 1401 yes 0 0
## 1402 yes 0 0
## 1403 yes 0 0
## 1404 no 1 0
## 1405 yes 0 0
## 1406 yes 0 0
## 1407 yes 0 0
## 1408 no 0 0
## 1409 yes 0 0
## 1410 yes 0 0
## 1411 yes 1 1
## 1412 no 0 0
## 1413 yes 0 0
## 1414 yes 0 0
## 1415 no 0 0
## 1416 no 1 1
## 1417 yes 0 0
## 1418 no 0 0
## 1419 yes 0 0
## 1420 no 1 1
## 1421 yes 0 0
## 1422 no 0 0
## 1423 no 0 0
## 1424 no 0 0
## 1425 yes 0 0
## 1426 no 0 0
## 1427 no 0 0
## 1428 no 0 0
## 1429 yes 0 0
## 1430 no 0 0
## 1431 no 0 0
## 1432 no 0 0
## 1433 yes 0 0
## 1434 no 0 0
## 1435 yes 0 0
## 1436 yes 0 0
## 1437 no 0 0
## 1438 yes 0 0
## 1439 no 0 0
## 1440 no 0 0
## 1441 yes 0 0
## 1442 yes 0 0
## 1443 no 0 0
## 1444 no 1 1
## 1445 yes 0 0
## 1446 no 0 0
## 1447 yes 0 0
## 1448 yes 0 0
## 1449 no 0 0
## 1450 yes 0 0
## 1451 yes 0 0
## 1452 no 0 0
## 1453 no 1 0
## 1454 no 1 0
## 1455 no 1 0
## 1456 no 0 0
## 1457 no 0 0
## 1458 no 0 0
## 1459 no 0 0
## 1460 yes 0 0
## 1461 no 0 0
## 1462 yes 0 0
## 1463 no 0 0
## 1464 yes 0 0
## 1465 no 0 0
## 1466 no 0 0
## 1467 yes 0 0
## 1468 yes 0 0
## 1469 yes 0 0
## 1470 yes 0 0
## 1471 yes 0 0
## 1472 no 0 0
## 1473 yes 0 0
## 1474 yes 0 0
## 1475 no 0 0
## 1476 yes 0 0
## 1477 no 0 0
## 1478 yes 0 0
## 1479 yes 0 0
## 1480 no 1 1
## 1481 yes 0 0
## 1482 no 0 0
## 1483 no 0 0
## 1484 yes 0 0
## 1485 no 1 1
## 1486 yes 0 0
## 1487 yes 0 0
## 1488 no 0 0
## 1489 yes 0 0
## 1490 yes 0 0
## 1491 no 1 1
## 1492 yes 0 0
## 1493 no 0 0
## 1494 no 0 0
## 1495 no 0 0
## 1496 no 0 0
## 1497 no 0 0
## 1498 no 0 0
## 1499 no 0 0
## 1500 no 0 0
## 1501 no 0 0
## 1502 no 0 0
## 1503 no 0 0
## 1504 no 1 1
## 1505 yes 0 0
## 1506 no 0 0
## 1507 no 1 1
## 1508 no 0 0
## 1509 no 0 0
## 1510 no 0 0
## 1511 no 0 0
## 1512 yes 0 0
## 1513 yes 0 0
## 1514 no 0 0
## 1515 no 0 0
## 1516 yes 0 0
## 1517 yes 0 0
## 1518 yes 1 1
## 1519 yes 0 0
## 1520 no 0 0
## 1521 yes 3 4
## 1522 yes 0 0
## 1523 yes 0 0
## 1524 no 0 0
## 1525 yes 0 0
## 1526 no 0 0
## 1527 no 0 0
## 1528 yes 0 0
## 1529 yes 0 0
## 1530 no 0 0
## 1531 no 1 0
## 1532 yes 0 0
## 1533 yes 0 0
## 1534 yes 0 0
## 1535 yes 0 0
## 1536 yes 0 0
## 1537 yes 0 0
## 1538 no 0 0
## 1539 yes 0 0
## 1540 yes 0 0
## 1541 yes 0 0
## 1542 no 1 1
## 1543 yes 0 0
## 1544 yes 0 0
## 1545 yes 1 1
## 1546 no 0 0
## 1547 yes 0 0
## 1548 no 0 0
## 1549 yes 0 0
## 1550 no 0 0
## 1551 no 0 0
## 1552 yes 0 0
## 1553 yes 0 0
## 1554 no 0 0
## 1555 yes 0 0
## 1556 no 0 3
## 1557 no 0 0
## 1558 yes 0 0
## 1559 no 1 1
## 1560 no 0 0
## 1561 no 0 0
## 1562 no 0 0
## 1563 no 0 0
## 1564 yes 0 0
## 1565 no 0 0
## 1566 yes 0 0
## 1567 no 0 0
## 1568 no 0 0
## 1569 no 0 0
## 1570 yes 0 0
## 1571 no 0 0
## 1572 no 1 1
## 1573 yes 0 0
## 1574 yes 5 0
## 1575 no 0 0
## 1576 no 0 0
## 1577 no 1 0
## 1578 no 0 0
## 1579 no 0 0
## 1580 yes 0 0
## 1581 no 0 0
## 1582 no 0 0
## 1583 no 0 0
## 1584 no 0 0
## 1585 no 0 0
## 1586 yes 0 0
## 1587 no 0 0
## 1588 yes 0 0
## 1589 no 0 0
## 1590 yes 0 0
## 1591 yes 0 0
## 1592 yes 0 0
## 1593 yes 0 0
## 1594 yes 0 0
## 1595 yes 0 0
## 1596 yes 0 0
## 1597 no 0 0
## 1598 no 0 0
## 1599 yes 0 0
## 1600 yes 0 0
## 1601 yes 0 0
## 1602 no 0 0
## 1603 no 0 0
## 1604 no 0 0
## 1605 no 0 0
## 1606 yes 0 0
## 1607 yes 0 0
## 1608 yes 0 0
## 1609 yes 0 0
## 1610 no 0 0
## 1611 yes 0 0
## 1612 yes 0 0
## 1613 yes 0 0
## 1614 no 0 0
## 1615 no 0 0
## 1616 no 0 0
## 1617 yes 0 0
## 1618 yes 0 0
## 1619 yes 0 0
## 1620 yes 0 0
## 1621 no 0 0
## 1622 no 0 0
## 1623 no 0 0
## 1624 no 0 0
## 1625 no 0 0
## 1626 yes 0 0
## 1627 yes 0 0
## 1628 no 0 0
## 1629 yes 0 0
## 1630 yes 0 0
## 1631 yes 0 0
## 1632 yes 0 0
## 1633 yes 0 0
## 1634 yes 0 0
## 1635 no 0 0
## 1636 no 0 0
## 1637 yes 0 0
## 1638 yes 0 0
## 1639 yes 0 0
## 1640 yes 0 0
## 1641 yes 0 0
## 1642 yes 0 0
## 1643 yes 0 0
## 1644 yes 0 0
## 1645 yes 0 0
## 1646 yes 0 0
## 1647 yes 0 0
## 1648 yes 0 0
## 1649 yes 0 0
## 1650 no 0 0
## 1651 yes 0 0
## 1652 no 0 0
## 1653 no 0 0
## 1654 no 0 0
## 1655 yes 0 0
## 1656 yes 0 0
## 1657 no 0 0
## 1658 yes 0 0
## 1659 yes 0 0
## 1660 yes 0 0
## 1661 yes 0 0
## 1662 yes 0 0
## 1663 yes 0 0
## 1664 no 0 0
## 1665 yes 0 0
## 1666 no 0 0
## 1667 yes 0 0
## 1668 yes 0 0
## 1669 yes 0 0
## 1670 no 0 0
## 1671 yes 0 0
## 1672 no 0 0
## 1673 yes 0 0
## 1674 yes 0 0
## 1675 yes 0 0
## 1676 yes 0 0
## 1677 no 0 0
## 1678 yes 0 0
## 1679 yes 0 0
## 1680 yes 0 0
## 1681 yes 0 0
## 1682 yes 0 0
## 1683 yes 0 0
## 1684 yes 0 0
## 1685 yes 0 0
## 1686 yes 0 0
## 1687 yes 0 0
## 1688 no 0 0
## 1689 yes 0 0
## 1690 yes 0 0
## 1691 no 0 0
## 1692 yes 0 0
## 1693 yes 0 0
## 1694 yes 0 0
## 1695 yes 0 0
## 1696 yes 0 0
## 1697 yes 0 0
## 1698 yes 0 0
## 1699 no 0 0
## 1700 yes 0 0
## 1701 no 0 0
## 1702 yes 0 0
## 1703 no 0 0
## 1704 yes 0 0
## 1705 yes 0 0
## 1706 no 0 0
## 1707 yes 0 0
## 1708 yes 0 0
## 1709 yes 0 0
## 1710 yes 0 0
## 1711 yes 0 0
## 1712 yes 0 0
## 1713 yes 0 0
## 1714 no 0 0
## 1715 yes 0 0
## 1716 yes 0 0
## 1717 yes 0 0
## 1718 yes 0 0
## 1719 yes 0 0
## 1720 yes 0 0
## 1721 yes 0 0
## 1722 yes 0 0
## 1723 yes 0 0
## 1724 yes 0 0
## 1725 no 0 0
## 1726 no 0 0
## 1727 no 0 0
## 1728 yes 0 0
## 1729 yes 0 0
## 1730 yes 0 0
## 1731 yes 0 0
## 1732 yes 0 0
## 1733 no 0 0
## 1734 yes 0 0
## 1735 yes 0 0
## 1736 no 0 0
## 1737 yes 0 0
## 1738 yes 0 0
## 1739 yes 0 0
## 1740 yes 0 0
## 1741 yes 0 0
## 1742 no 0 0
## 1743 yes 0 0
## 1744 no 0 0
## 1745 yes 0 0
## 1746 yes 0 0
## 1747 yes 0 0
## 1748 yes 0 0
## 1749 no 0 0
## 1750 no 0 0
## 1751 no 0 0
## 1752 yes 0 0
## 1753 yes 0 0
## 1754 no 0 0
## 1755 yes 0 0
## 1756 yes 0 0
## 1757 yes 0 0
## 1758 yes 0 0
## 1759 yes 0 0
## 1760 yes 0 0
## 1761 no 0 0
## 1762 no 0 0
## 1763 yes 0 0
## 1764 yes 0 0
## 1765 yes 0 0
## 1766 yes 0 0
## 1767 yes 0 0
## 1768 yes 0 0
## 1769 no 0 0
## 1770 yes 0 0
## 1771 yes 0 0
## 1772 yes 0 0
## 1773 yes 0 0
## 1774 yes 0 0
## 1775 yes 0 0
## 1776 no 0 0
## 1777 no 0 0
## 1778 yes 0 0
## 1779 yes 0 0
## 1780 yes 0 0
## 1781 yes 0 0
## 1782 no 0 0
## 1783 no 0 0
## 1784 no 0 0
## 1785 yes 0 0
## 1786 yes 0 0
## 1787 no 0 0
## 1788 yes 0 0
## 1789 no 0 0
## 1790 yes 0 0
## 1791 yes 0 0
## 1792 yes 0 0
## 1793 yes 0 0
## 1794 no 0 0
## 1795 yes 0 0
## 1796 yes 0 0
## 1797 yes 0 0
## 1798 yes 0 0
## 1799 yes 0 0
## 1800 no 0 0
## 1801 yes 0 0
## 1802 yes 0 0
## 1803 yes 0 0
## 1804 yes 0 0
## 1805 yes 0 0
## 1806 no 0 0
## 1807 yes 0 0
## 1808 yes 0 0
## 1809 no 0 0
## 1810 yes 0 0
## 1811 no 0 0
## 1812 no 0 0
## 1813 yes 0 0
## 1814 yes 0 0
## 1815 yes 0 0
## 1816 yes 0 0
## 1817 yes 0 0
## 1818 yes 0 0
## 1819 yes 0 0
## 1820 yes 0 0
## 1821 no 0 0
## 1822 yes 0 0
## 1823 yes 0 0
## 1824 yes 0 0
## 1825 yes 0 0
## 1826 yes 0 0
## 1827 yes 0 0
## 1828 no 0 0
## 1829 yes 0 0
## 1830 yes 0 0
## 1831 yes 0 0
## 1832 no 0 0
## 1833 yes 0 0
## 1834 no 0 0
## 1835 yes 0 0
## 1836 yes 0 0
## 1837 no 0 0
## 1838 no 0 0
## 1839 no 0 0
## 1840 yes 0 0
## 1841 yes 0 0
## 1842 no 0 0
## 1843 no 0 0
## 1844 no 0 0
## 1845 yes 0 0
## 1846 no 0 0
## 1847 yes 0 0
## 1848 no 0 0
## 1849 no 0 0
## 1850 no 0 0
## 1851 no 0 0
## 1852 no 0 0
## 1853 yes 0 0
## 1854 yes 0 0
## 1855 yes 0 0
## 1856 yes 0 0
## 1857 yes 0 0
## 1858 yes 0 0
## 1859 no 0 0
## 1860 yes 0 0
## 1861 no 0 0
## 1862 yes 0 0
## 1863 yes 0 0
## 1864 yes 0 0
## 1865 yes 0 0
## 1866 yes 0 0
## 1867 yes 0 0
## 1868 yes 0 0
## 1869 yes 0 0
## 1870 yes 0 0
## 1871 no 0 0
## 1872 yes 0 0
## 1873 no 0 0
## 1874 yes 0 0
## 1875 no 0 0
## 1876 yes 0 0
## 1877 no 0 0
## 1878 yes 0 0
## 1879 yes 0 0
## 1880 yes 0 0
## 1881 yes 0 0
## 1882 yes 0 0
## 1883 yes 0 0
## 1884 no 0 0
## 1885 yes 0 0
## 1886 yes 0 0
## 1887 yes 0 0
## 1888 yes 0 0
## 1889 yes 0 0
## 1890 yes 0 0
## 1891 yes 0 0
## 1892 yes 0 0
## 1893 yes 0 0
## 1894 no 0 0
## 1895 yes 0 0
## 1896 yes 0 0
## 1897 no 0 0
## 1898 yes 0 0
## 1899 no 0 0
## 1900 yes 0 0
## 1901 yes 0 0
## 1902 yes 0 0
## 1903 yes 0 0
## 1904 yes 0 0
## 1905 yes 0 0
## 1906 yes 0 0
## 1907 yes 0 0
## 1908 yes 0 0
## 1909 yes 0 0
## 1910 yes 0 0
## 1911 yes 0 0
## 1912 no 0 0
## 1913 yes 0 0
## 1914 no 0 0
## 1915 yes 0 0
## 1916 yes 0 0
## 1917 no 0 0
## 1918 yes 0 0
## 1919 yes 0 0
## 1920 yes 0 0
## 1921 no 0 0
## 1922 no 0 0
## 1923 yes 0 0
## 1924 yes 0 0
## 1925 yes 0 0
## 1926 no 0 0
## 1927 yes 0 0
## 1928 yes 0 0
## 1929 yes 0 0
## 1930 yes 0 0
## 1931 yes 0 0
## 1932 no 0 0
## 1933 yes 0 0
## 1934 yes 0 0
## 1935 no 0 0
## 1936 yes 0 0
## 1937 yes 0 0
## 1938 yes 0 0
## 1939 yes 0 0
## 1940 yes 0 0
## 1941 yes 0 0
## 1942 yes 0 0
## 1943 yes 0 0
## 1944 yes 0 0
## 1945 yes 0 0
## 1946 yes 0 0
## 1947 yes 0 0
## 1948 yes 0 0
## 1949 no 0 0
## 1950 yes 0 0
## 1951 yes 0 0
## 1952 yes 0 0
## 1953 yes 0 0
## 1954 yes 0 0
## 1955 no 0 0
## 1956 no 0 0
## 1957 no 0 0
## 1958 yes 0 0
## 1959 yes 0 0
## 1960 yes 0 0
## 1961 yes 0 0
## 1962 yes 0 0
## 1963 no 0 0
## 1964 no 0 0
## 1965 yes 0 0
## 1966 yes 0 0
## 1967 yes 0 0
## 1968 no 0 0
## 1969 yes 0 0
## 1970 yes 0 0
## 1971 yes 0 0
## 1972 no 0 0
## 1973 yes 0 0
## 1974 yes 0 0
## 1975 yes 0 0
## 1976 no 0 0
## 1977 yes 0 0
## 1978 no 0 0
## 1979 yes 0 0
## 1980 yes 0 0
## 1981 yes 0 0
## 1982 no 0 0
## 1983 no 0 0
## 1984 yes 0 0
## 1985 yes 0 0
## 1986 yes 0 0
## 1987 no 0 0
## 1988 yes 0 0
## 1989 yes 0 0
## 1990 no 0 0
## 1991 yes 0 0
## 1992 yes 0 0
## 1993 no 0 0
## 1994 yes 0 0
## 1995 yes 0 0
## 1996 yes 0 0
## 1997 yes 0 0
## 1998 yes 0 0
## 1999 yes 0 0
## 2000 no 0 0
## 2001 no 0 0
## 2002 yes 0 0
## 2003 no 0 0
## 2004 yes 0 0
## 2005 no 0 0
## 2006 yes 0 0
## 2007 yes 0 0
## 2008 no 0 0
## 2009 yes 0 0
## 2010 yes 0 0
## 2011 no 0 0
## 2012 no 0 0
## 2013 no 0 0
## 2014 yes 0 0
## 2015 no 0 0
## 2016 no 0 0
## 2017 yes 0 0
## 2018 no 0 0
## 2019 yes 0 0
## 2020 no 0 0
## 2021 no 0 0
## 2022 no 0 0
## 2023 no 0 0
## 2024 yes 0 0
## 2025 no 0 0
## 2026 no 0 0
## 2027 no 0 0
## 2028 yes 0 0
## 2029 yes 0 0
## 2030 no 0 0
## 2031 yes 0 0
## 2032 yes 0 0
## 2033 yes 0 0
## 2034 yes 0 0
## 2035 no 0 0
## 2036 yes 0 0
## 2037 no 0 0
## 2038 yes 0 0
## 2039 no 0 0
## 2040 yes 0 0
## 2041 no 0 0
## 2042 yes 0 0
## 2043 yes 0 0
## 2044 no 0 0
## 2045 no 0 0
## 2046 no 0 0
## 2047 yes 0 0
## 2048 yes 0 0
## 2049 no 0 0
## 2050 yes 0 0
## 2051 yes 0 0
## 2052 no 0 0
## 2053 yes 0 0
## 2054 no 0 0
## 2055 no 0 0
## 2056 no 0 0
## 2057 yes 0 0
## 2058 no 0 0
## 2059 no 0 0
## 2060 no 0 0
## 2061 no 0 0
## 2062 no 0 0
## 2063 no 0 0
## 2064 no 0 0
## Inflight_Entertainment_NotRated Wifi_Connectivity_NotRated
## 1 1 1
## 2 1 1
## 3 1 1
## 4 1 1
## 5 1 1
## 6 0 0
## 7 1 1
## 8 1 1
## 9 1 1
## 10 1 1
## 11 1 1
## 12 0 0
## 13 0 0
## 14 1 1
## 15 1 1
## 16 1 1
## 17 1 1
## 18 0 0
## 19 1 1
## 20 1 1
## 21 1 1
## 22 1 1
## 23 1 1
## 24 1 1
## 25 1 1
## 26 1 1
## 27 1 1
## 28 1 1
## 29 1 1
## 30 1 1
## 31 1 1
## 32 0 0
## 33 1 1
## 34 1 1
## 35 0 0
## 36 1 1
## 37 1 1
## 38 0 1
## 39 0 0
## 40 1 1
## 41 1 1
## 42 0 0
## 43 0 1
## 44 1 1
## 45 1 1
## 46 1 1
## 47 1 1
## 48 1 1
## 49 1 1
## 50 1 1
## 51 1 0
## 52 0 0
## 53 1 1
## 54 1 1
## 55 1 1
## 56 1 1
## 57 1 1
## 58 0 0
## 59 1 1
## 60 1 1
## 61 1 1
## 62 1 1
## 63 1 1
## 64 1 1
## 65 1 1
## 66 0 0
## 67 1 1
## 68 0 0
## 69 1 1
## 70 1 1
## 71 1 1
## 72 1 1
## 73 1 1
## 74 1 1
## 75 1 1
## 76 1 1
## 77 1 1
## 78 1 1
## 79 1 1
## 80 1 1
## 81 1 1
## 82 0 0
## 83 1 1
## 84 1 1
## 85 1 1
## 86 1 1
## 87 1 1
## 88 1 1
## 89 1 1
## 90 1 1
## 91 1 1
## 92 0 0
## 93 1 1
## 94 1 1
## 95 0 0
## 96 1 1
## 97 0 0
## 98 1 1
## 99 1 1
## 100 1 1
## 101 1 1
## 102 0 0
## 103 1 1
## 104 1 1
## 105 1 1
## 106 1 1
## 107 1 1
## 108 1 1
## 109 1 1
## 110 1 1
## 111 1 1
## 112 1 1
## 113 0 0
## 114 1 1
## 115 1 1
## 116 1 1
## 117 1 1
## 118 1 1
## 119 1 1
## 120 0 1
## 121 1 1
## 122 0 0
## 123 1 1
## 124 1 1
## 125 1 1
## 126 1 1
## 127 0 0
## 128 0 0
## 129 1 1
## 130 1 1
## 131 1 1
## 132 1 1
## 133 1 1
## 134 1 1
## 135 1 1
## 136 1 1
## 137 1 1
## 138 1 1
## 139 0 0
## 140 1 1
## 141 0 1
## 142 1 1
## 143 1 1
## 144 1 1
## 145 1 1
## 146 1 1
## 147 1 1
## 148 1 1
## 149 1 1
## 150 1 1
## 151 1 1
## 152 0 0
## 153 0 0
## 154 1 1
## 155 1 1
## 156 1 0
## 157 0 0
## 158 1 1
## 159 1 1
## 160 1 1
## 161 0 0
## 162 1 1
## 163 0 0
## 164 1 1
## 165 1 1
## 166 1 1
## 167 1 1
## 168 1 1
## 169 1 1
## 170 1 1
## 171 1 1
## 172 1 1
## 173 1 1
## 174 1 1
## 175 1 1
## 176 0 0
## 177 1 1
## 178 1 1
## 179 1 1
## 180 1 1
## 181 0 0
## 182 1 1
## 183 1 1
## 184 1 1
## 185 0 0
## 186 1 1
## 187 1 1
## 188 1 1
## 189 0 0
## 190 1 1
## 191 1 1
## 192 1 1
## 193 0 0
## 194 0 1
## 195 0 0
## 196 1 1
## 197 1 1
## 198 0 0
## 199 1 1
## 200 1 1
## 201 1 1
## 202 1 1
## 203 1 1
## 204 0 0
## 205 0 0
## 206 1 1
## 207 0 0
## 208 0 1
## 209 1 1
## 210 1 1
## 211 1 1
## 212 0 0
## 213 0 1
## 214 1 0
## 215 0 0
## 216 1 1
## 217 1 1
## 218 0 0
## 219 0 0
## 220 0 0
## 221 0 0
## 222 1 1
## 223 0 0
## 224 1 1
## 225 1 1
## 226 0 0
## 227 1 1
## 228 0 0
## 229 1 1
## 230 1 1
## 231 1 1
## 232 1 1
## 233 0 0
## 234 1 1
## 235 0 0
## 236 0 0
## 237 1 1
## 238 1 1
## 239 1 1
## 240 0 1
## 241 1 1
## 242 1 1
## 243 1 1
## 244 1 1
## 245 1 1
## 246 1 1
## 247 0 0
## 248 1 1
## 249 1 1
## 250 1 1
## 251 1 1
## 252 1 1
## 253 1 1
## 254 1 1
## 255 0 1
## 256 1 1
## 257 1 1
## 258 1 1
## 259 0 0
## 260 1 1
## 261 0 1
## 262 1 1
## 263 1 1
## 264 1 1
## 265 1 1
## 266 1 1
## 267 1 1
## 268 1 1
## 269 1 1
## 270 1 1
## 271 1 1
## 272 1 1
## 273 0 1
## 274 1 1
## 275 1 1
## 276 1 1
## 277 1 1
## 278 1 1
## 279 1 1
## 280 1 1
## 281 0 0
## 282 1 1
## 283 0 0
## 284 1 1
## 285 1 1
## 286 0 0
## 287 1 1
## 288 1 1
## 289 0 0
## 290 1 1
## 291 1 1
## 292 1 1
## 293 1 1
## 294 1 1
## 295 1 1
## 296 1 1
## 297 1 1
## 298 1 1
## 299 1 1
## 300 1 1
## 301 1 1
## 302 0 0
## 303 1 1
## 304 1 1
## 305 1 1
## 306 1 1
## 307 1 1
## 308 1 1
## 309 1 1
## 310 1 1
## 311 1 1
## 312 1 1
## 313 1 1
## 314 1 1
## 315 1 1
## 316 1 1
## 317 1 1
## 318 1 1
## 319 1 1
## 320 1 1
## 321 1 1
## 322 0 0
## 323 1 1
## 324 1 1
## 325 1 1
## 326 1 1
## 327 1 1
## 328 1 1
## 329 1 1
## 330 1 1
## 331 1 1
## 332 1 1
## 333 1 1
## 334 1 1
## 335 1 1
## 336 1 1
## 337 1 1
## 338 0 0
## 339 1 1
## 340 1 1
## 341 1 1
## 342 1 1
## 343 1 1
## 344 1 1
## 345 1 1
## 346 1 1
## 347 1 1
## 348 1 1
## 349 1 1
## 350 1 1
## 351 1 1
## 352 1 1
## 353 1 1
## 354 1 1
## 355 1 1
## 356 0 0
## 357 1 1
## 358 1 1
## 359 1 1
## 360 1 1
## 361 1 1
## 362 1 1
## 363 1 1
## 364 1 1
## 365 1 1
## 366 1 1
## 367 1 1
## 368 1 1
## 369 0 0
## 370 1 1
## 371 0 1
## 372 1 1
## 373 1 1
## 374 1 1
## 375 1 1
## 376 0 1
## 377 1 1
## 378 1 1
## 379 1 1
## 380 1 1
## 381 1 1
## 382 1 1
## 383 0 0
## 384 1 1
## 385 0 0
## 386 1 1
## 387 1 1
## 388 1 1
## 389 1 1
## 390 1 1
## 391 1 1
## 392 0 0
## 393 0 0
## 394 0 0
## 395 0 0
## 396 1 1
## 397 1 1
## 398 1 1
## 399 1 1
## 400 1 1
## 401 1 1
## 402 1 1
## 403 1 1
## 404 1 1
## 405 0 0
## 406 1 1
## 407 1 1
## 408 1 1
## 409 1 1
## 410 0 1
## 411 1 1
## 412 1 1
## 413 1 1
## 414 0 0
## 415 0 0
## 416 0 0
## 417 0 0
## 418 1 1
## 419 1 1
## 420 1 1
## 421 1 1
## 422 1 1
## 423 1 1
## 424 1 1
## 425 0 1
## 426 0 0
## 427 1 1
## 428 1 1
## 429 1 1
## 430 1 1
## 431 1 1
## 432 1 1
## 433 1 1
## 434 1 1
## 435 1 1
## 436 1 1
## 437 1 1
## 438 1 1
## 439 0 0
## 440 1 1
## 441 1 1
## 442 1 1
## 443 1 1
## 444 1 1
## 445 0 1
## 446 0 0
## 447 1 1
## 448 1 1
## 449 0 0
## 450 1 1
## 451 1 1
## 452 1 1
## 453 1 1
## 454 1 1
## 455 1 1
## 456 1 1
## 457 0 0
## 458 1 1
## 459 1 1
## 460 1 1
## 461 1 1
## 462 1 1
## 463 1 1
## 464 1 1
## 465 1 1
## 466 0 0
## 467 1 1
## 468 1 1
## 469 1 1
## 470 1 1
## 471 0 0
## 472 1 0
## 473 1 1
## 474 1 1
## 475 1 1
## 476 1 1
## 477 1 1
## 478 1 1
## 479 0 0
## 480 1 1
## 481 1 1
## 482 0 1
## 483 1 1
## 484 0 0
## 485 1 1
## 486 0 0
## 487 0 0
## 488 0 0
## 489 1 1
## 490 1 1
## 491 0 0
## 492 0 1
## 493 1 1
## 494 1 1
## 495 0 1
## 496 0 0
## 497 1 1
## 498 1 1
## 499 1 1
## 500 1 1
## 501 1 1
## 502 1 1
## 503 1 1
## 504 1 1
## 505 1 1
## 506 0 0
## 507 1 1
## 508 0 0
## 509 1 1
## 510 1 1
## 511 1 0
## 512 0 0
## 513 1 1
## 514 1 1
## 515 1 1
## 516 0 0
## 517 1 1
## 518 0 0
## 519 1 1
## 520 1 1
## 521 0 1
## 522 1 1
## 523 1 1
## 524 0 0
## 525 0 0
## 526 1 1
## 527 1 1
## 528 1 1
## 529 1 1
## 530 1 1
## 531 1 1
## 532 0 1
## 533 1 1
## 534 1 1
## 535 1 1
## 536 1 1
## 537 1 1
## 538 1 1
## 539 0 0
## 540 0 0
## 541 0 0
## 542 1 1
## 543 1 1
## 544 1 1
## 545 0 0
## 546 0 0
## 547 1 1
## 548 1 1
## 549 0 0
## 550 1 1
## 551 1 1
## 552 1 1
## 553 0 0
## 554 0 0
## 555 1 1
## 556 1 1
## 557 0 0
## 558 1 1
## 559 1 1
## 560 1 1
## 561 1 1
## 562 1 1
## 563 1 1
## 564 1 1
## 565 1 1
## 566 1 1
## 567 0 0
## 568 1 1
## 569 0 1
## 570 1 1
## 571 1 1
## 572 1 1
## 573 1 0
## 574 1 1
## 575 1 1
## 576 1 1
## 577 0 0
## 578 1 1
## 579 1 1
## 580 1 1
## 581 1 1
## 582 1 1
## 583 1 1
## 584 1 1
## 585 1 0
## 586 1 1
## 587 0 0
## 588 1 1
## 589 0 0
## 590 1 1
## 591 1 1
## 592 1 1
## 593 1 1
## 594 1 1
## 595 1 1
## 596 1 1
## 597 1 1
## 598 0 1
## 599 1 1
## 600 1 1
## 601 1 1
## 602 0 0
## 603 1 1
## 604 0 0
## 605 0 0
## 606 1 1
## 607 1 1
## 608 1 1
## 609 1 1
## 610 1 1
## 611 1 1
## 612 1 1
## 613 1 1
## 614 1 1
## 615 1 1
## 616 0 0
## 617 1 1
## 618 0 0
## 619 1 1
## 620 1 1
## 621 1 1
## 622 1 1
## 623 1 1
## 624 0 1
## 625 1 1
## 626 1 1
## 627 1 1
## 628 1 1
## 629 1 1
## 630 1 1
## 631 1 1
## 632 1 1
## 633 1 1
## 634 1 1
## 635 1 1
## 636 1 1
## 637 1 1
## 638 1 1
## 639 1 1
## 640 1 1
## 641 1 1
## 642 1 1
## 643 1 1
## 644 0 0
## 645 0 0
## 646 1 0
## 647 1 1
## 648 0 1
## 649 1 1
## 650 1 1
## 651 0 1
## 652 1 1
## 653 1 1
## 654 1 1
## 655 1 1
## 656 1 1
## 657 1 1
## 658 1 1
## 659 1 1
## 660 1 1
## 661 0 0
## 662 0 0
## 663 1 1
## 664 1 1
## 665 1 1
## 666 1 1
## 667 1 1
## 668 1 1
## 669 1 1
## 670 1 1
## 671 1 1
## 672 0 1
## 673 1 1
## 674 0 0
## 675 1 1
## 676 1 1
## 677 1 1
## 678 0 0
## 679 0 0
## 680 0 0
## 681 1 1
## 682 1 1
## 683 1 1
## 684 0 0
## 685 1 1
## 686 1 1
## 687 1 1
## 688 1 1
## 689 0 0
## 690 0 0
## 691 1 1
## 692 1 1
## 693 1 1
## 694 1 1
## 695 0 0
## 696 1 1
## 697 1 1
## 698 0 0
## 699 1 1
## 700 1 1
## 701 1 1
## 702 0 0
## 703 1 1
## 704 1 1
## 705 1 1
## 706 1 1
## 707 0 0
## 708 1 1
## 709 0 0
## 710 1 1
## 711 1 1
## 712 1 1
## 713 1 1
## 714 1 1
## 715 1 1
## 716 1 1
## 717 0 0
## 718 1 1
## 719 1 1
## 720 1 1
## 721 1 1
## 722 0 1
## 723 1 1
## 724 1 1
## 725 1 1
## 726 0 0
## 727 1 1
## 728 1 1
## 729 1 1
## 730 0 1
## 731 1 1
## 732 1 1
## 733 1 1
## 734 1 1
## 735 0 0
## 736 1 1
## 737 1 1
## 738 1 1
## 739 0 0
## 740 1 1
## 741 1 1
## 742 0 0
## 743 1 1
## 744 1 1
## 745 1 1
## 746 1 1
## 747 0 0
## 748 0 1
## 749 1 1
## 750 1 1
## 751 0 0
## 752 1 1
## 753 0 0
## 754 1 1
## 755 0 0
## 756 0 0
## 757 0 1
## 758 1 1
## 759 1 1
## 760 0 1
## 761 0 0
## 762 0 0
## 763 1 1
## 764 1 1
## 765 1 1
## 766 0 0
## 767 1 1
## 768 1 1
## 769 1 1
## 770 0 0
## 771 0 0
## 772 1 1
## 773 0 0
## 774 1 1
## 775 1 1
## 776 1 1
## 777 1 1
## 778 1 1
## 779 1 1
## 780 1 1
## 781 1 1
## 782 1 1
## 783 1 1
## 784 1 1
## 785 1 1
## 786 0 0
## 787 1 1
## 788 1 1
## 789 1 1
## 790 1 1
## 791 1 1
## 792 0 0
## 793 0 0
## 794 1 1
## 795 1 1
## 796 1 1
## 797 1 1
## 798 1 1
## 799 1 1
## 800 1 1
## 801 1 1
## 802 1 0
## 803 1 1
## 804 0 0
## 805 1 1
## 806 0 0
## 807 0 1
## 808 0 0
## 809 0 0
## 810 1 1
## 811 1 1
## 812 1 1
## 813 1 1
## 814 0 0
## 815 0 0
## 816 1 1
## 817 1 1
## 818 1 0
## 819 1 1
## 820 0 0
## 821 1 1
## 822 1 1
## 823 1 1
## 824 1 1
## 825 1 1
## 826 1 1
## 827 0 0
## 828 1 1
## 829 0 0
## 830 1 1
## 831 0 0
## 832 1 1
## 833 1 1
## 834 1 1
## 835 0 0
## 836 1 1
## 837 1 1
## 838 1 1
## 839 1 1
## 840 0 0
## 841 1 1
## 842 1 1
## 843 1 1
## 844 1 1
## 845 1 1
## 846 1 1
## 847 1 1
## 848 1 1
## 849 1 1
## 850 1 1
## 851 1 1
## 852 1 1
## 853 1 1
## 854 0 1
## 855 1 1
## 856 1 1
## 857 1 1
## 858 1 1
## 859 1 1
## 860 1 1
## 861 1 1
## 862 0 0
## 863 0 0
## 864 1 1
## 865 1 1
## 866 1 1
## 867 1 1
## 868 1 1
## 869 1 1
## 870 1 1
## 871 1 1
## 872 0 1
## 873 1 1
## 874 1 1
## 875 0 0
## 876 1 1
## 877 1 1
## 878 1 1
## 879 0 0
## 880 1 1
## 881 1 1
## 882 1 1
## 883 0 0
## 884 1 1
## 885 1 1
## 886 0 1
## 887 1 1
## 888 1 1
## 889 1 1
## 890 1 1
## 891 1 1
## 892 0 0
## 893 0 0
## 894 1 1
## 895 0 0
## 896 0 0
## 897 1 1
## 898 1 1
## 899 1 1
## 900 0 0
## 901 1 1
## 902 1 1
## 903 1 1
## 904 1 1
## 905 1 1
## 906 1 1
## 907 0 0
## 908 1 1
## 909 1 1
## 910 0 0
## 911 1 1
## 912 0 0
## 913 0 0
## 914 0 1
## 915 1 1
## 916 1 1
## 917 1 1
## 918 0 1
## 919 1 1
## 920 0 0
## 921 1 1
## 922 1 1
## 923 0 0
## 924 0 1
## 925 1 1
## 926 1 1
## 927 1 1
## 928 1 1
## 929 1 1
## 930 1 1
## 931 1 1
## 932 1 1
## 933 1 1
## 934 1 1
## 935 0 0
## 936 1 1
## 937 1 1
## 938 1 1
## 939 1 1
## 940 1 1
## 941 1 1
## 942 0 0
## 943 1 1
## 944 1 1
## 945 1 1
## 946 1 1
## 947 0 1
## 948 0 1
## 949 1 1
## 950 1 1
## 951 1 1
## 952 1 1
## 953 0 0
## 954 1 1
## 955 1 1
## 956 1 1
## 957 1 1
## 958 1 1
## 959 1 1
## 960 1 1
## 961 1 1
## 962 1 1
## 963 1 1
## 964 0 0
## 965 1 1
## 966 1 1
## 967 1 1
## 968 1 1
## 969 1 1
## 970 1 1
## 971 1 1
## 972 1 1
## 973 1 1
## 974 1 1
## 975 1 1
## 976 0 0
## 977 1 1
## 978 1 1
## 979 1 1
## 980 1 1
## 981 1 1
## 982 1 1
## 983 1 1
## 984 1 1
## 985 1 1
## 986 1 1
## 987 1 1
## 988 1 1
## 989 1 1
## 990 1 1
## 991 1 1
## 992 1 1
## 993 1 1
## 994 1 1
## 995 1 1
## 996 1 1
## 997 1 1
## 998 0 0
## 999 1 1
## 1000 1 1
## 1001 1 1
## 1002 0 0
## 1003 1 1
## 1004 1 1
## 1005 1 1
## 1006 1 1
## 1007 0 1
## 1008 1 1
## 1009 1 1
## 1010 1 1
## 1011 1 1
## 1012 0 0
## 1013 1 1
## 1014 1 1
## 1015 1 1
## 1016 0 1
## 1017 0 0
## 1018 1 1
## 1019 1 1
## 1020 1 1
## 1021 1 1
## 1022 1 1
## 1023 1 1
## 1024 1 1
## 1025 1 1
## 1026 1 1
## 1027 0 1
## 1028 0 1
## 1029 1 1
## 1030 1 1
## 1031 1 1
## 1032 1 1
## 1033 1 0
## 1034 1 1
## 1035 1 1
## 1036 1 1
## 1037 1 1
## 1038 1 1
## 1039 1 1
## 1040 1 1
## 1041 1 1
## 1042 1 1
## 1043 0 0
## 1044 1 1
## 1045 1 1
## 1046 1 1
## 1047 0 0
## 1048 1 1
## 1049 1 1
## 1050 0 0
## 1051 1 1
## 1052 1 1
## 1053 1 1
## 1054 1 1
## 1055 0 1
## 1056 1 1
## 1057 0 0
## 1058 1 1
## 1059 0 0
## 1060 1 1
## 1061 0 0
## 1062 1 1
## 1063 0 1
## 1064 1 1
## 1065 1 1
## 1066 0 0
## 1067 1 1
## 1068 0 0
## 1069 1 1
## 1070 1 1
## 1071 1 1
## 1072 1 1
## 1073 1 1
## 1074 1 1
## 1075 0 1
## 1076 1 1
## 1077 1 1
## 1078 1 1
## 1079 0 0
## 1080 1 1
## 1081 1 1
## 1082 1 1
## 1083 1 1
## 1084 1 1
## 1085 1 1
## 1086 0 1
## 1087 1 1
## 1088 1 1
## 1089 1 0
## 1090 1 1
## 1091 1 1
## 1092 1 1
## 1093 1 1
## 1094 1 1
## 1095 1 1
## 1096 1 1
## 1097 1 1
## 1098 1 1
## 1099 0 1
## 1100 1 1
## 1101 1 1
## 1102 1 1
## 1103 1 1
## 1104 0 0
## 1105 1 1
## 1106 1 1
## 1107 1 1
## 1108 1 1
## 1109 1 1
## 1110 1 1
## 1111 1 1
## 1112 1 1
## 1113 0 1
## 1114 1 1
## 1115 1 1
## 1116 1 1
## 1117 1 1
## 1118 1 1
## 1119 1 1
## 1120 1 1
## 1121 1 1
## 1122 1 1
## 1123 0 0
## 1124 1 1
## 1125 0 0
## 1126 1 1
## 1127 0 0
## 1128 1 1
## 1129 1 1
## 1130 1 1
## 1131 1 1
## 1132 1 1
## 1133 1 1
## 1134 1 1
## 1135 1 1
## 1136 1 1
## 1137 0 0
## 1138 1 0
## 1139 0 0
## 1140 1 1
## 1141 1 1
## 1142 0 0
## 1143 1 1
## 1144 0 0
## 1145 1 1
## 1146 0 0
## 1147 0 1
## 1148 1 1
## 1149 1 1
## 1150 1 1
## 1151 0 0
## 1152 1 1
## 1153 1 1
## 1154 0 1
## 1155 1 1
## 1156 1 1
## 1157 0 1
## 1158 0 1
## 1159 0 0
## 1160 1 1
## 1161 1 1
## 1162 1 1
## 1163 1 1
## 1164 1 1
## 1165 1 1
## 1166 1 1
## 1167 1 1
## 1168 0 0
## 1169 1 1
## 1170 0 1
## 1171 1 1
## 1172 1 1
## 1173 1 1
## 1174 1 1
## 1175 1 1
## 1176 1 1
## 1177 1 1
## 1178 1 1
## 1179 1 1
## 1180 1 1
## 1181 1 1
## 1182 1 1
## 1183 0 0
## 1184 1 1
## 1185 1 1
## 1186 1 1
## 1187 1 1
## 1188 1 1
## 1189 1 1
## 1190 1 1
## 1191 1 1
## 1192 1 1
## 1193 1 1
## 1194 0 0
## 1195 1 1
## 1196 1 1
## 1197 1 1
## 1198 1 1
## 1199 1 1
## 1200 1 1
## 1201 1 1
## 1202 0 0
## 1203 1 1
## 1204 0 0
## 1205 1 1
## 1206 0 0
## 1207 1 1
## 1208 1 1
## 1209 1 1
## 1210 1 1
## 1211 1 1
## 1212 1 1
## 1213 1 1
## 1214 1 1
## 1215 1 1
## 1216 1 1
## 1217 1 1
## 1218 1 1
## 1219 1 1
## 1220 1 1
## 1221 1 1
## 1222 1 1
## 1223 1 1
## 1224 1 1
## 1225 1 1
## 1226 1 1
## 1227 1 1
## 1228 1 1
## 1229 1 1
## 1230 1 1
## 1231 1 1
## 1232 1 1
## 1233 1 1
## 1234 1 1
## 1235 1 1
## 1236 0 0
## 1237 0 0
## 1238 1 1
## 1239 1 1
## 1240 1 1
## 1241 1 1
## 1242 1 1
## 1243 1 1
## 1244 1 1
## 1245 1 1
## 1246 1 1
## 1247 1 1
## 1248 0 0
## 1249 0 0
## 1250 1 0
## 1251 1 1
## 1252 1 1
## 1253 1 1
## 1254 1 1
## 1255 1 1
## 1256 1 1
## 1257 0 0
## 1258 1 1
## 1259 0 0
## 1260 1 1
## 1261 1 1
## 1262 1 1
## 1263 0 0
## 1264 1 1
## 1265 1 1
## 1266 1 1
## 1267 0 0
## 1268 1 1
## 1269 1 1
## 1270 1 1
## 1271 0 0
## 1272 1 1
## 1273 0 0
## 1274 1 1
## 1275 1 1
## 1276 1 1
## 1277 1 1
## 1278 0 1
## 1279 1 1
## 1280 0 0
## 1281 0 1
## 1282 0 1
## 1283 1 1
## 1284 1 1
## 1285 0 0
## 1286 1 1
## 1287 1 1
## 1288 1 1
## 1289 1 1
## 1290 1 1
## 1291 1 1
## 1292 0 1
## 1293 1 1
## 1294 1 1
## 1295 1 1
## 1296 1 1
## 1297 1 1
## 1298 1 1
## 1299 1 1
## 1300 1 1
## 1301 1 1
## 1302 1 1
## 1303 0 1
## 1304 1 1
## 1305 1 1
## 1306 1 1
## 1307 0 1
## 1308 1 1
## 1309 1 1
## 1310 1 1
## 1311 1 1
## 1312 1 1
## 1313 1 1
## 1314 1 1
## 1315 1 1
## 1316 1 1
## 1317 0 1
## 1318 1 1
## 1319 1 1
## 1320 1 1
## 1321 1 1
## 1322 1 1
## 1323 1 1
## 1324 1 1
## 1325 1 1
## 1326 1 1
## 1327 1 1
## 1328 1 1
## 1329 1 1
## 1330 1 1
## 1331 1 1
## 1332 1 1
## 1333 1 1
## 1334 1 1
## 1335 1 1
## 1336 1 1
## 1337 1 1
## 1338 0 0
## 1339 1 1
## 1340 1 1
## 1341 1 1
## 1342 1 1
## 1343 1 1
## 1344 0 1
## 1345 1 1
## 1346 1 1
## 1347 1 1
## 1348 1 1
## 1349 1 1
## 1350 1 1
## 1351 0 1
## 1352 1 1
## 1353 1 1
## 1354 1 1
## 1355 0 1
## 1356 1 1
## 1357 1 1
## 1358 1 1
## 1359 1 1
## 1360 1 1
## 1361 1 1
## 1362 0 1
## 1363 1 1
## 1364 0 1
## 1365 1 1
## 1366 1 1
## 1367 1 1
## 1368 1 1
## 1369 1 1
## 1370 1 1
## 1371 1 1
## 1372 1 1
## 1373 1 1
## 1374 1 1
## 1375 1 1
## 1376 0 1
## 1377 0 0
## 1378 1 1
## 1379 1 1
## 1380 1 1
## 1381 1 1
## 1382 1 1
## 1383 1 1
## 1384 1 1
## 1385 1 1
## 1386 0 0
## 1387 1 1
## 1388 1 1
## 1389 1 1
## 1390 1 1
## 1391 1 1
## 1392 1 1
## 1393 1 1
## 1394 1 1
## 1395 0 0
## 1396 1 1
## 1397 1 1
## 1398 1 1
## 1399 1 1
## 1400 1 1
## 1401 1 1
## 1402 1 1
## 1403 1 1
## 1404 0 1
## 1405 1 1
## 1406 1 1
## 1407 1 1
## 1408 1 1
## 1409 1 1
## 1410 1 1
## 1411 0 0
## 1412 1 1
## 1413 1 1
## 1414 1 1
## 1415 1 1
## 1416 0 0
## 1417 1 1
## 1418 1 1
## 1419 1 1
## 1420 0 0
## 1421 1 1
## 1422 1 1
## 1423 1 1
## 1424 1 1
## 1425 1 1
## 1426 1 1
## 1427 1 1
## 1428 1 1
## 1429 1 1
## 1430 1 1
## 1431 1 1
## 1432 1 1
## 1433 1 1
## 1434 1 1
## 1435 1 1
## 1436 1 1
## 1437 1 1
## 1438 1 1
## 1439 1 1
## 1440 1 1
## 1441 1 1
## 1442 1 1
## 1443 1 1
## 1444 0 0
## 1445 1 1
## 1446 1 1
## 1447 1 1
## 1448 1 1
## 1449 1 1
## 1450 1 1
## 1451 1 1
## 1452 1 1
## 1453 0 1
## 1454 0 1
## 1455 0 1
## 1456 1 1
## 1457 1 1
## 1458 1 1
## 1459 1 1
## 1460 1 1
## 1461 1 1
## 1462 1 1
## 1463 1 1
## 1464 1 1
## 1465 1 1
## 1466 1 1
## 1467 1 1
## 1468 1 1
## 1469 1 1
## 1470 1 1
## 1471 1 1
## 1472 1 1
## 1473 1 1
## 1474 1 1
## 1475 1 1
## 1476 1 1
## 1477 1 1
## 1478 1 1
## 1479 1 1
## 1480 0 0
## 1481 1 1
## 1482 1 1
## 1483 1 1
## 1484 1 1
## 1485 0 0
## 1486 1 1
## 1487 1 1
## 1488 1 1
## 1489 1 1
## 1490 1 1
## 1491 0 0
## 1492 1 1
## 1493 1 1
## 1494 1 1
## 1495 1 1
## 1496 1 1
## 1497 1 1
## 1498 1 1
## 1499 1 1
## 1500 1 1
## 1501 1 1
## 1502 1 1
## 1503 1 1
## 1504 0 0
## 1505 1 1
## 1506 1 1
## 1507 0 0
## 1508 1 1
## 1509 1 1
## 1510 1 1
## 1511 1 1
## 1512 1 1
## 1513 1 1
## 1514 1 1
## 1515 1 1
## 1516 1 1
## 1517 1 1
## 1518 0 0
## 1519 1 1
## 1520 1 1
## 1521 0 0
## 1522 1 1
## 1523 1 1
## 1524 1 1
## 1525 1 1
## 1526 1 1
## 1527 1 1
## 1528 1 1
## 1529 1 1
## 1530 1 1
## 1531 0 1
## 1532 1 1
## 1533 1 1
## 1534 1 1
## 1535 1 1
## 1536 1 1
## 1537 1 1
## 1538 1 1
## 1539 1 1
## 1540 1 1
## 1541 1 1
## 1542 0 0
## 1543 1 1
## 1544 1 1
## 1545 0 0
## 1546 1 1
## 1547 1 1
## 1548 1 1
## 1549 1 1
## 1550 1 1
## 1551 1 1
## 1552 1 1
## 1553 1 1
## 1554 1 1
## 1555 1 1
## 1556 1 0
## 1557 1 1
## 1558 1 1
## 1559 0 0
## 1560 1 1
## 1561 1 1
## 1562 1 1
## 1563 1 1
## 1564 1 1
## 1565 1 1
## 1566 1 1
## 1567 1 1
## 1568 1 1
## 1569 1 1
## 1570 1 1
## 1571 1 1
## 1572 0 0
## 1573 1 1
## 1574 0 1
## 1575 1 1
## 1576 1 1
## 1577 0 1
## 1578 1 1
## 1579 1 1
## 1580 1 1
## 1581 1 1
## 1582 1 1
## 1583 1 1
## 1584 1 1
## 1585 1 1
## 1586 1 1
## 1587 1 1
## 1588 1 1
## 1589 1 1
## 1590 1 1
## 1591 1 1
## 1592 1 1
## 1593 1 1
## 1594 1 1
## 1595 1 1
## 1596 1 1
## 1597 1 1
## 1598 1 1
## 1599 1 1
## 1600 1 1
## 1601 1 1
## 1602 1 1
## 1603 1 1
## 1604 1 1
## 1605 1 1
## 1606 1 1
## 1607 1 1
## 1608 1 1
## 1609 1 1
## 1610 1 1
## 1611 1 1
## 1612 1 1
## 1613 1 1
## 1614 1 1
## 1615 1 1
## 1616 1 1
## 1617 1 1
## 1618 1 1
## 1619 1 1
## 1620 1 1
## 1621 1 1
## 1622 1 1
## 1623 1 1
## 1624 1 1
## 1625 1 1
## 1626 1 1
## 1627 1 1
## 1628 1 1
## 1629 1 1
## 1630 1 1
## 1631 1 1
## 1632 1 1
## 1633 1 1
## 1634 1 1
## 1635 1 1
## 1636 1 1
## 1637 1 1
## 1638 1 1
## 1639 1 1
## 1640 1 1
## 1641 1 1
## 1642 1 1
## 1643 1 1
## 1644 1 1
## 1645 1 1
## 1646 1 1
## 1647 1 1
## 1648 1 1
## 1649 1 1
## 1650 1 1
## 1651 1 1
## 1652 1 1
## 1653 1 1
## 1654 1 1
## 1655 1 1
## 1656 1 1
## 1657 1 1
## 1658 1 1
## 1659 1 1
## 1660 1 1
## 1661 1 1
## 1662 1 1
## 1663 1 1
## 1664 1 1
## 1665 1 1
## 1666 1 1
## 1667 1 1
## 1668 1 1
## 1669 1 1
## 1670 1 1
## 1671 1 1
## 1672 1 1
## 1673 1 1
## 1674 1 1
## 1675 1 1
## 1676 1 1
## 1677 1 1
## 1678 1 1
## 1679 1 1
## 1680 1 1
## 1681 1 1
## 1682 1 1
## 1683 1 1
## 1684 1 1
## 1685 1 1
## 1686 1 1
## 1687 1 1
## 1688 1 1
## 1689 1 1
## 1690 1 1
## 1691 1 1
## 1692 1 1
## 1693 1 1
## 1694 1 1
## 1695 1 1
## 1696 1 1
## 1697 1 1
## 1698 1 1
## 1699 1 1
## 1700 1 1
## 1701 1 1
## 1702 1 1
## 1703 1 1
## 1704 1 1
## 1705 1 1
## 1706 1 1
## 1707 1 1
## 1708 1 1
## 1709 1 1
## 1710 1 1
## 1711 1 1
## 1712 1 1
## 1713 1 1
## 1714 1 1
## 1715 1 1
## 1716 1 1
## 1717 1 1
## 1718 1 1
## 1719 1 1
## 1720 1 1
## 1721 1 1
## 1722 1 1
## 1723 1 1
## 1724 1 1
## 1725 1 1
## 1726 1 1
## 1727 1 1
## 1728 1 1
## 1729 1 1
## 1730 1 1
## 1731 1 1
## 1732 1 1
## 1733 1 1
## 1734 1 1
## 1735 1 1
## 1736 1 1
## 1737 1 1
## 1738 1 1
## 1739 1 1
## 1740 1 1
## 1741 1 1
## 1742 1 1
## 1743 1 1
## 1744 1 1
## 1745 1 1
## 1746 1 1
## 1747 1 1
## 1748 1 1
## 1749 1 1
## 1750 1 1
## 1751 1 1
## 1752 1 1
## 1753 1 1
## 1754 1 1
## 1755 1 1
## 1756 1 1
## 1757 1 1
## 1758 1 1
## 1759 1 1
## 1760 1 1
## 1761 1 1
## 1762 1 1
## 1763 1 1
## 1764 1 1
## 1765 1 1
## 1766 1 1
## 1767 1 1
## 1768 1 1
## 1769 1 1
## 1770 1 1
## 1771 1 1
## 1772 1 1
## 1773 1 1
## 1774 1 1
## 1775 1 1
## 1776 1 1
## 1777 1 1
## 1778 1 1
## 1779 1 1
## 1780 1 1
## 1781 1 1
## 1782 1 1
## 1783 1 1
## 1784 1 1
## 1785 1 1
## 1786 1 1
## 1787 1 1
## 1788 1 1
## 1789 1 1
## 1790 1 1
## 1791 1 1
## 1792 1 1
## 1793 1 1
## 1794 1 1
## 1795 1 1
## 1796 1 1
## 1797 1 1
## 1798 1 1
## 1799 1 1
## 1800 1 1
## 1801 1 1
## 1802 1 1
## 1803 1 1
## 1804 1 1
## 1805 1 1
## 1806 1 1
## 1807 1 1
## 1808 1 1
## 1809 1 1
## 1810 1 1
## 1811 1 1
## 1812 1 1
## 1813 1 1
## 1814 1 1
## 1815 1 1
## 1816 1 1
## 1817 1 1
## 1818 1 1
## 1819 1 1
## 1820 1 1
## 1821 1 1
## 1822 1 1
## 1823 1 1
## 1824 1 1
## 1825 1 1
## 1826 1 1
## 1827 1 1
## 1828 1 1
## 1829 1 1
## 1830 1 1
## 1831 1 1
## 1832 1 1
## 1833 1 1
## 1834 1 1
## 1835 1 1
## 1836 1 1
## 1837 1 1
## 1838 1 1
## 1839 1 1
## 1840 1 1
## 1841 1 1
## 1842 1 1
## 1843 1 1
## 1844 1 1
## 1845 1 1
## 1846 1 1
## 1847 1 1
## 1848 1 1
## 1849 1 1
## 1850 1 1
## 1851 1 1
## 1852 1 1
## 1853 1 1
## 1854 1 1
## 1855 1 1
## 1856 1 1
## 1857 1 1
## 1858 1 1
## 1859 1 1
## 1860 1 1
## 1861 1 1
## 1862 1 1
## 1863 1 1
## 1864 1 1
## 1865 1 1
## 1866 1 1
## 1867 1 1
## 1868 1 1
## 1869 1 1
## 1870 1 1
## 1871 1 1
## 1872 1 1
## 1873 1 1
## 1874 1 1
## 1875 1 1
## 1876 1 1
## 1877 1 1
## 1878 1 1
## 1879 1 1
## 1880 1 1
## 1881 1 1
## 1882 1 1
## 1883 1 1
## 1884 1 1
## 1885 1 1
## 1886 1 1
## 1887 1 1
## 1888 1 1
## 1889 1 1
## 1890 1 1
## 1891 1 1
## 1892 1 1
## 1893 1 1
## 1894 1 1
## 1895 1 1
## 1896 1 1
## 1897 1 1
## 1898 1 1
## 1899 1 1
## 1900 1 1
## 1901 1 1
## 1902 1 1
## 1903 1 1
## 1904 1 1
## 1905 1 1
## 1906 1 1
## 1907 1 1
## 1908 1 1
## 1909 1 1
## 1910 1 1
## 1911 1 1
## 1912 1 1
## 1913 1 1
## 1914 1 1
## 1915 1 1
## 1916 1 1
## 1917 1 1
## 1918 1 1
## 1919 1 1
## 1920 1 1
## 1921 1 1
## 1922 1 1
## 1923 1 1
## 1924 1 1
## 1925 1 1
## 1926 1 1
## 1927 1 1
## 1928 1 1
## 1929 1 1
## 1930 1 1
## 1931 1 1
## 1932 1 1
## 1933 1 1
## 1934 1 1
## 1935 1 1
## 1936 1 1
## 1937 1 1
## 1938 1 1
## 1939 1 1
## 1940 1 1
## 1941 1 1
## 1942 1 1
## 1943 1 1
## 1944 1 1
## 1945 1 1
## 1946 1 1
## 1947 1 1
## 1948 1 1
## 1949 1 1
## 1950 1 1
## 1951 1 1
## 1952 1 1
## 1953 1 1
## 1954 1 1
## 1955 1 1
## 1956 1 1
## 1957 1 1
## 1958 1 1
## 1959 1 1
## 1960 1 1
## 1961 1 1
## 1962 1 1
## 1963 1 1
## 1964 1 1
## 1965 1 1
## 1966 1 1
## 1967 1 1
## 1968 1 1
## 1969 1 1
## 1970 1 1
## 1971 1 1
## 1972 1 1
## 1973 1 1
## 1974 1 1
## 1975 1 1
## 1976 1 1
## 1977 1 1
## 1978 1 1
## 1979 1 1
## 1980 1 1
## 1981 1 1
## 1982 1 1
## 1983 1 1
## 1984 1 1
## 1985 1 1
## 1986 1 1
## 1987 1 1
## 1988 1 1
## 1989 1 1
## 1990 1 1
## 1991 1 1
## 1992 1 1
## 1993 1 1
## 1994 1 1
## 1995 1 1
## 1996 1 1
## 1997 1 1
## 1998 1 1
## 1999 1 1
## 2000 1 1
## 2001 1 1
## 2002 1 1
## 2003 1 1
## 2004 1 1
## 2005 1 1
## 2006 1 1
## 2007 1 1
## 2008 1 1
## 2009 1 1
## 2010 1 1
## 2011 1 1
## 2012 1 1
## 2013 1 1
## 2014 1 1
## 2015 1 1
## 2016 1 1
## 2017 1 1
## 2018 1 1
## 2019 1 1
## 2020 1 1
## 2021 1 1
## 2022 1 1
## 2023 1 1
## 2024 1 1
## 2025 1 1
## 2026 1 1
## 2027 1 1
## 2028 1 1
## 2029 1 1
## 2030 1 1
## 2031 1 1
## 2032 1 1
## 2033 1 1
## 2034 1 1
## 2035 1 1
## 2036 1 1
## 2037 1 1
## 2038 1 1
## 2039 1 1
## 2040 1 1
## 2041 1 1
## 2042 1 1
## 2043 1 1
## 2044 1 1
## 2045 1 1
## 2046 1 1
## 2047 1 1
## 2048 1 1
## 2049 1 1
## 2050 1 1
## 2051 1 1
## 2052 1 1
## 2053 1 1
## 2054 1 1
## 2055 1 1
## 2056 1 1
## 2057 1 1
## 2058 1 1
## 2059 1 1
## 2060 1 1
## 2061 1 1
## 2062 1 1
## 2063 1 1
## 2064 1 1
## Food_Beverages_NotRated Ground_Service_NotRated lat_origin lon_origin
## 1 0 0 37.016294 -7.9351820
## 2 0 0 54.597580 -5.9277097
## 3 0 0 55.953346 -3.1883749
## 4 0 0 37.016294 -7.9351820
## 5 1 0 53.349379 -6.2605593
## 6 0 0 55.686724 12.5700724
## 7 0 0 51.886965 0.2441929
## 8 1 0 49.430100 2.0823355
## 9 1 0 50.938361 6.9599740
## 10 1 0 50.061947 19.9368564
## 11 1 0 41.150219 -8.6103497
## 12 0 0 50.867782 7.1389610
## 13 0 0 38.343637 -0.4881708
## 14 0 0 51.453802 -2.5972985
## 15 1 0 38.707751 -9.1365919
## 16 1 0 53.797418 -1.5437941
## 17 0 0 45.437191 12.3345898
## 18 0 0 39.469707 -0.3763353
## 19 1 0 59.913330 10.7389701
## 20 1 0 32.085300 34.7818064
## 21 1 0 45.756656 9.7542192
## 22 1 0 52.479699 -1.9026911
## 23 1 0 48.208354 16.3725042
## 24 0 0 51.507446 -0.1277653
## 25 0 0 51.886965 0.2441929
## 26 0 0 50.411623 4.4445280
## 27 1 0 53.118818 -1.2597069
## 28 1 0 50.846557 4.3516970
## 29 1 0 38.707751 -9.1365919
## 30 1 0 38.707751 -9.1365919
## 31 0 0 50.463637 4.4661733
## 32 0 0 40.416782 -3.7035070
## 33 1 0 43.342656 3.2131307
## 34 1 0 49.963274 7.2691209
## 35 0 0 53.794799 -8.9193547
## 36 1 0 36.721303 -4.4216366
## 37 1 0 42.493662 27.4721276
## 38 0 0 41.382580 2.1770730
## 39 0 0 33.959768 -83.3763980
## 40 1 0 34.021845 -6.8408929
## 41 0 0 53.075820 8.8071646
## 42 0 0 41.771214 12.2278855
## 43 0 0 41.893320 12.4829321
## 44 1 0 51.544096 -0.0040005
## 45 1 0 31.625826 -7.9891608
## 46 0 0 50.938361 6.9599740
## 47 1 0 53.118818 -1.2597069
## 48 0 0 51.886965 0.2441929
## 49 1 0 42.697703 23.3217359
## 50 1 0 37.149805 -91.4328245
## 51 1 0 39.591337 19.8596189
## 52 0 0 52.517389 13.3951309
## 53 1 0 36.407111 25.4566637
## 54 1 0 50.846557 4.3516970
## 55 1 0 53.349379 -6.2605593
## 56 0 0 41.125784 16.8620293
## 57 1 0 41.150219 -8.6103497
## 58 1 0 33.959768 -83.3763980
## 59 1 0 51.544096 -0.0040005
## 60 1 0 50.213732 19.0058848
## 61 0 0 32.085300 34.7818064
## 62 1 1 48.208354 16.3725042
## 63 1 0 53.349379 -6.2605593
## 64 1 0 40.416782 -3.7035070
## 65 1 0 38.707751 -9.1365919
## 66 0 0 55.953346 -3.1883749
## 67 1 0 55.953346 -3.1883749
## 68 0 0 45.437191 12.3345898
## 69 1 0 38.343637 -0.4881708
## 70 1 0 51.886965 0.2441929
## 71 1 0 38.707751 -9.1365919
## 72 0 0 41.800289 12.6004706
## 73 0 0 44.493820 11.3426327
## 74 0 0 45.437191 12.3345898
## 75 1 0 51.507446 -0.1277653
## 76 1 0 50.061947 19.9368564
## 77 1 0 41.893320 12.4829321
## 78 0 0 53.349379 -6.2605593
## 79 1 0 51.453802 -2.5972985
## 80 1 0 53.349379 -6.2605593
## 81 0 0 38.343637 -0.4881708
## 82 0 0 56.949398 24.1051846
## 83 0 0 55.742767 37.6169076
## 84 1 0 33.959768 -83.3763980
## 85 1 0 38.974390 1.4197463
## 86 1 0 48.208354 16.3725042
## 87 0 0 43.296174 5.3699525
## 88 1 0 37.016294 -7.9351820
## 89 1 0 51.514227 7.4652789
## 90 1 0 51.544096 -0.0040005
## 91 0 0 55.686724 12.5700724
## 92 1 0 51.886965 0.2441929
## 93 0 0 48.208354 16.3725042
## 94 1 0 50.110644 8.6820917
## 95 0 0 45.464194 9.1896346
## 96 0 0 37.016294 -7.9351820
## 97 0 0 51.886965 0.2441929
## 98 1 0 45.437191 12.3345898
## 99 1 0 32.751750 -16.9817487
## 100 1 0 45.437191 12.3345898
## 101 0 0 52.517389 13.3951309
## 102 0 0 59.913330 10.7389701
## 103 0 0 45.437191 12.3345898
## 104 1 0 48.208354 16.3725042
## 105 1 0 50.846557 4.3516970
## 106 1 0 39.469707 -0.3763353
## 107 0 0 45.813097 15.9772795
## 108 1 0 51.453802 -2.5972985
## 109 1 0 57.688694 12.2190170
## 110 0 0 52.479699 -1.9026911
## 111 1 1 51.886965 0.2441929
## 112 1 0 38.707751 -9.1365919
## 113 0 0 57.707233 11.9670171
## 114 1 0 53.349379 -6.2605593
## 115 0 0 37.034399 27.4306510
## 116 1 0 51.886965 0.2441929
## 117 1 0 37.388630 -5.9953403
## 118 1 0 32.085300 34.7818064
## 119 1 0 59.437242 24.7572802
## 120 0 0 44.493820 11.3426327
## 121 1 0 55.953346 -3.1883749
## 122 0 0 51.886965 0.2441929
## 123 0 0 53.349379 -6.2605593
## 124 1 0 43.483252 -1.5592776
## 125 1 0 51.481655 -3.1791934
## 126 0 0 32.085300 34.7818064
## 127 0 0 51.507446 -0.1277653
## 128 0 0 51.448557 5.4501225
## 129 1 0 36.407111 25.4566637
## 130 1 0 38.707751 -9.1365919
## 131 1 0 53.349379 -6.2605593
## 132 0 0 50.061947 19.9368564
## 133 0 0 38.343637 -0.4881708
## 134 1 0 60.166620 24.9435408
## 135 0 0 48.208354 16.3725042
## 136 1 0 51.507446 -0.1277653
## 137 0 0 51.453802 -2.5972985
## 138 1 0 52.479699 -1.9026911
## 139 0 0 43.700936 7.2683912
## 140 1 0 38.707751 -9.1365919
## 141 1 0 53.866650 -1.6567819
## 142 1 0 40.416782 -3.7035070
## 143 1 0 32.751750 -16.9817487
## 144 1 0 51.453802 -2.5972985
## 145 0 0 28.400377 -14.0048697
## 146 0 0 51.886965 0.2441929
## 147 1 0 45.437191 12.3345898
## 148 1 0 41.382580 2.1770730
## 149 1 0 36.721303 -4.4216366
## 150 0 0 37.034399 27.4306510
## 151 1 0 36.407111 25.4566637
## 152 0 0 54.687046 25.2829111
## 153 0 0 59.913330 10.7389701
## 154 0 0 43.296174 5.3699525
## 155 1 0 53.349379 -6.2605593
## 156 1 0 52.373080 4.8924534
## 157 0 0 47.497879 19.0402383
## 158 1 0 41.150219 -8.6103497
## 159 1 0 38.707751 -9.1365919
## 160 0 0 53.349379 -6.2605593
## 161 0 0 59.325117 18.0710935
## 162 1 0 53.349379 -6.2605593
## 163 0 0 47.181759 19.5060937
## 164 1 0 53.349379 -6.2605593
## 165 1 0 51.886965 0.2441929
## 166 1 0 53.349379 -6.2605593
## 167 0 0 50.846557 4.3516970
## 168 1 0 49.418616 2.0958657
## 169 1 0 50.463637 4.4661733
## 170 1 0 44.841225 -0.5800364
## 171 1 0 55.953346 -3.1883749
## 172 1 0 53.479489 -2.2451148
## 173 1 0 53.407199 -2.9916800
## 174 1 0 41.150219 -8.6103497
## 175 1 0 52.373080 4.8924534
## 176 0 0 60.166620 24.9435408
## 177 0 0 55.953346 -3.1883749
## 178 0 0 38.111227 13.3524434
## 179 1 0 56.949398 24.1051846
## 180 0 0 52.373080 4.8924534
## 181 1 0 35.512083 24.0191544
## 182 0 0 39.569582 2.6500745
## 183 1 0 51.886965 0.2441929
## 184 1 0 52.479699 -1.9026911
## 185 0 0 39.469707 -0.3763353
## 186 1 0 28.293578 -16.6214471
## 187 0 0 51.891073 -0.4230304
## 188 0 0 35.512083 24.0191544
## 189 1 0 50.059629 14.4464593
## 190 1 0 35.888599 14.4476911
## 191 1 0 38.707751 -9.1365919
## 192 1 0 39.591337 19.8596189
## 193 0 0 39.591337 19.8596189
## 194 1 0 40.416782 -3.7035070
## 195 1 0 51.507446 -0.1277653
## 196 1 0 44.436141 26.1027202
## 197 0 0 41.150219 -8.6103497
## 198 0 0 44.407260 8.9338624
## 199 1 0 32.085300 34.7818064
## 200 1 0 65.583119 22.1459535
## 201 1 0 53.866650 -1.6567819
## 202 1 0 52.517389 13.3951309
## 203 1 0 54.687046 25.2829111
## 204 0 0 43.296174 5.3699525
## 205 0 0 50.059629 14.4464593
## 206 1 0 50.059629 14.4464593
## 207 0 0 41.382580 2.1770730
## 208 0 0 31.951569 35.9239625
## 209 0 0 50.846557 4.3516970
## 210 0 0 40.640317 22.9352716
## 211 1 0 32.085300 34.7818064
## 212 0 0 50.846557 4.3516970
## 213 0 0 53.479489 -2.2451148
## 214 0 0 55.953346 -3.1883749
## 215 0 0 38.343637 -0.4881708
## 216 0 0 52.479699 -1.9026911
## 217 1 0 52.517389 13.3951309
## 218 0 0 57.148243 -2.0928095
## 219 1 0 50.938361 6.9599740
## 220 0 0 37.388630 -5.9953403
## 221 0 0 51.507446 -0.1277653
## 222 1 0 53.479489 -2.2451148
## 223 0 0 39.569582 2.6500745
## 224 0 0 48.853495 2.3483915
## 225 0 0 37.016294 -7.9351820
## 226 0 0 53.797418 -1.5437941
## 227 0 0 51.886965 0.2441929
## 228 0 0 53.479489 -2.2451148
## 229 1 0 40.640317 22.9352716
## 230 1 0 37.016294 -7.9351820
## 231 1 0 28.400377 -14.0048697
## 232 1 0 50.061947 19.9368564
## 233 0 0 43.471472 10.6797912
## 234 1 1 36.721303 -4.4216366
## 235 0 0 60.166620 24.9435408
## 236 0 0 51.507446 -0.1277653
## 237 1 0 45.756656 9.7542192
## 238 1 0 37.016294 -7.9351820
## 239 0 0 38.343637 -0.4881708
## 240 0 0 28.293578 -16.6214471
## 241 1 0 45.464194 9.1896346
## 242 1 0 53.479489 -2.2451148
## 243 1 0 59.437242 24.7572802
## 244 1 0 41.382580 2.1770730
## 245 1 0 51.544096 -0.0040005
## 246 0 0 40.416782 -3.7035070
## 247 0 0 32.085300 34.7818064
## 248 0 0 52.408266 16.9335199
## 249 0 0 50.846557 4.3516970
## 250 1 0 59.325117 18.0710935
## 251 1 1 50.110644 8.6820917
## 252 1 0 53.349379 -6.2605593
## 253 1 1 43.296174 5.3699525
## 254 1 0 52.517389 13.3951309
## 255 1 0 51.886965 0.2441929
## 256 1 0 38.707751 -9.1365919
## 257 0 0 51.453802 -2.5972985
## 258 0 0 55.498280 -4.6113017
## 259 0 0 32.085300 34.7818064
## 260 1 0 59.437242 24.7572802
## 261 0 0 46.484302 30.7322878
## 262 1 0 34.774399 32.4231586
## 263 1 0 41.893320 12.4829321
## 264 1 0 50.938361 6.9599740
## 265 1 0 44.493820 11.3426327
## 266 1 0 53.479489 -2.2451148
## 267 1 0 35.512083 24.0191544
## 268 1 0 51.886965 0.2441929
## 269 1 1 39.469707 -0.3763353
## 270 1 0 50.110644 8.6820917
## 271 1 0 51.453802 -2.5972985
## 272 1 0 38.343637 -0.4881708
## 273 0 0 51.507446 -0.1277653
## 274 1 0 45.756656 9.7542192
## 275 1 0 39.591337 19.8596189
## 276 0 0 41.382580 2.1770730
## 277 1 0 51.507446 -0.1277653
## 278 0 0 39.469707 -0.3763353
## 279 1 0 50.450034 30.5241361
## 280 1 0 51.886965 0.2441929
## 281 0 0 51.507446 -0.1277653
## 282 0 0 51.544096 -0.0040005
## 283 1 0 48.208354 16.3725042
## 284 1 0 50.110644 8.6820917
## 285 1 0 40.177711 44.5126233
## 286 0 0 33.959768 -83.3763980
## 287 1 1 42.697703 23.3217359
## 288 0 0 47.497879 19.0402383
## 289 0 0 51.507446 -0.1277653
## 290 1 0 50.938361 6.9599740
## 291 1 0 41.382580 2.1770730
## 292 0 0 42.697703 23.3217359
## 293 1 0 47.497879 19.0402383
## 294 1 0 36.721303 -4.4216366
## 295 1 0 4.679209 -74.1004214
## 296 1 1 50.059629 14.4464593
## 297 0 0 52.373080 4.8924534
## 298 1 0 51.448557 5.4501225
## 299 1 0 50.846557 4.3516970
## 300 1 0 36.407111 25.4566637
## 301 1 0 47.497879 19.0402383
## 302 0 0 38.343637 -0.4881708
## 303 1 0 51.886965 0.2441929
## 304 1 1 51.886965 0.2441929
## 305 1 1 51.891073 -0.4230304
## 306 1 1 51.886965 0.2441929
## 307 1 1 51.886965 0.2441929
## 308 1 1 38.343637 -0.4881708
## 309 0 0 41.382580 2.1770730
## 310 1 0 53.118818 -1.2597069
## 311 1 0 53.349379 -6.2605593
## 312 1 1 53.118818 -1.2597069
## 313 1 1 45.464194 9.1896346
## 314 1 0 51.886965 0.2441929
## 315 1 0 36.721303 -4.4216366
## 316 1 1 51.544096 -0.0040005
## 317 1 0 51.544096 -0.0040005
## 318 0 0 37.502361 15.0873718
## 319 1 0 52.479699 -1.9026911
## 320 1 1 34.774399 32.4231586
## 321 0 0 55.953346 -3.1883749
## 322 0 0 53.349379 -6.2605593
## 323 1 1 53.479489 -2.2451148
## 324 1 1 53.349379 -6.2605593
## 325 1 1 53.479489 -2.2451148
## 326 1 1 52.479699 -1.9026911
## 327 1 0 47.497879 19.0402383
## 328 1 1 38.707751 -9.1365919
## 329 1 0 38.707751 -9.1365919
## 330 1 1 61.058342 28.1862293
## 331 1 0 53.349379 -6.2605593
## 332 1 0 48.137108 11.5753822
## 333 0 0 52.479699 -1.9026911
## 334 1 1 29.039708 -13.6362916
## 335 1 1 53.349379 -6.2605593
## 336 1 0 51.886965 0.2441929
## 337 1 0 53.349379 -6.2605593
## 338 0 0 51.891073 -0.4230304
## 339 1 0 38.707751 -9.1365919
## 340 1 1 53.479489 -2.2451148
## 341 1 1 51.891073 -0.4230304
## 342 1 1 51.886965 0.2441929
## 343 1 1 51.453802 -2.5972985
## 344 1 1 50.846557 4.3516970
## 345 1 1 51.507446 -0.1277653
## 346 1 0 52.056811 4.5386252
## 347 1 1 55.686724 12.5700724
## 348 1 1 44.436141 26.1027202
## 349 0 0 53.349379 -6.2605593
## 350 0 0 47.497879 19.0402383
## 351 1 1 50.725614 -3.5269209
## 352 1 1 51.448557 5.4501225
## 353 0 0 31.625826 -7.9891608
## 354 1 1 50.725614 -3.5269209
## 355 1 0 56.949398 24.1051846
## 356 0 0 37.149805 -91.4328245
## 357 1 1 55.686724 12.5700724
## 358 1 0 51.891073 -0.4230304
## 359 1 1 51.886965 0.2441929
## 360 1 0 53.479489 -2.2451148
## 361 1 0 44.493820 11.3426327
## 362 0 0 51.448557 5.4501225
## 363 0 0 40.640317 22.9352716
## 364 0 0 51.544096 -0.0040005
## 365 1 0 55.686724 12.5700724
## 366 1 0 57.707233 11.9670171
## 367 1 0 52.517389 13.3951309
## 368 1 0 50.061947 19.9368564
## 369 0 0 41.800289 12.6004706
## 370 1 0 51.898514 -8.4726423
## 371 0 0 52.517389 13.3951309
## 372 1 0 50.061947 19.9368564
## 373 0 0 41.800289 12.6004706
## 374 0 0 51.197090 -0.6943123
## 375 1 0 47.497879 19.0402383
## 376 1 0 47.497879 19.0402383
## 377 1 0 51.886965 0.2441929
## 378 1 0 44.493820 11.3426327
## 379 1 0 36.721303 -4.4216366
## 380 1 0 51.886965 0.2441929
## 381 0 0 51.949828 19.3907679
## 382 1 0 50.463637 4.4661733
## 383 0 0 51.448557 5.4501225
## 384 0 0 59.180217 10.2441245
## 385 0 0 41.382580 2.1770730
## 386 0 0 53.349379 -6.2605593
## 387 1 0 38.343637 -0.4881708
## 388 1 0 51.544096 -0.0040005
## 389 1 0 35.888599 14.4476911
## 390 0 0 51.197090 -0.6943123
## 391 1 0 42.697703 23.3217359
## 392 0 0 37.016294 -7.9351820
## 393 0 0 38.343637 -0.4881708
## 394 0 0 28.293578 -16.6214471
## 395 0 0 53.866650 -1.6567819
## 396 1 0 55.953346 -3.1883749
## 397 1 1 51.886965 0.2441929
## 398 1 0 41.382580 2.1770730
## 399 0 0 53.407199 -2.9916800
## 400 0 0 40.416782 -3.7035070
## 401 1 0 38.707751 -9.1365919
## 402 1 0 45.607370 9.5418715
## 403 1 0 50.059629 14.4464593
## 404 1 0 48.853495 2.3483915
## 405 0 0 15.323356 -23.7121211
## 406 1 0 53.349379 -6.2605593
## 407 1 0 47.497879 19.0402383
## 408 1 0 40.416782 -3.7035070
## 409 1 0 39.469707 -0.3763353
## 410 0 0 51.448557 5.4501225
## 411 1 1 51.448557 5.4501225
## 412 0 0 51.453802 -2.5972985
## 413 1 0 51.891073 -0.4230304
## 414 0 0 41.382580 2.1770730
## 415 0 0 38.974390 1.4197463
## 416 0 0 44.436141 26.1027202
## 417 0 0 45.437191 12.3345898
## 418 1 0 53.479489 -2.2451148
## 419 1 0 50.846557 4.3516970
## 420 1 0 51.886965 0.2441929
## 421 1 0 40.416782 -3.7035070
## 422 1 0 51.886965 0.2441929
## 423 1 0 36.721303 -4.4216366
## 424 1 0 51.886965 0.2441929
## 425 0 0 38.707751 -9.1365919
## 426 0 0 55.861155 -4.2501687
## 427 1 0 50.110644 8.6820917
## 428 0 0 40.635860 17.6884975
## 429 1 0 51.886965 0.2441929
## 430 1 0 55.953346 -3.1883749
## 431 1 0 37.388630 -5.9953403
## 432 1 0 45.437191 12.3345898
## 433 1 0 31.511828 -9.7620903
## 434 1 0 33.959768 -83.3763980
## 435 1 0 53.349379 -6.2605593
## 436 1 0 40.416782 -3.7035070
## 437 0 0 53.349379 -6.2605593
## 438 1 0 41.382580 2.1770730
## 439 0 0 52.479699 -1.9026911
## 440 1 0 52.373080 4.8924534
## 441 1 0 51.544096 -0.0040005
## 442 1 0 38.707751 -9.1365919
## 443 1 0 52.502539 -3.2573033
## 444 1 0 44.493820 11.3426327
## 445 1 0 43.700936 7.2683912
## 446 0 0 51.544096 -0.0040005
## 447 0 0 53.479489 -2.2451148
## 448 1 0 37.388630 -5.9953403
## 449 0 0 51.507446 -0.1277653
## 450 0 0 27.958000 -15.6062305
## 451 1 0 51.878102 -0.3664255
## 452 1 0 51.886965 0.2441929
## 453 1 0 48.137108 11.5753822
## 454 0 0 48.151699 17.1093063
## 455 1 0 43.604464 1.4442433
## 456 1 0 38.707751 -9.1365919
## 457 0 0 45.437191 12.3345898
## 458 0 0 51.886965 0.2441929
## 459 1 0 50.720151 -1.8799118
## 460 1 0 41.893320 12.4829321
## 461 1 0 32.085300 34.7818064
## 462 0 0 59.913330 10.7389701
## 463 0 0 53.794799 -8.9193547
## 464 1 0 52.517389 13.3951309
## 465 1 0 51.886965 0.2441929
## 466 0 0 36.721303 -4.4216366
## 467 1 0 52.479699 -1.9026911
## 468 1 0 35.512083 24.0191544
## 469 1 0 47.497879 19.0402383
## 470 1 0 51.448557 5.4501225
## 471 0 0 53.349379 -6.2605593
## 472 0 0 55.953346 -3.1883749
## 473 1 0 39.569582 2.6500745
## 474 1 0 41.382580 2.1770730
## 475 1 0 34.034653 -5.0161926
## 476 1 0 52.373080 4.8924534
## 477 0 0 49.430100 2.0823355
## 478 1 0 38.974390 1.4197463
## 479 0 0 50.059629 14.4464593
## 480 1 0 29.039708 -13.6362916
## 481 1 0 51.507446 -0.1277653
## 482 0 0 37.388630 -5.9953403
## 483 1 0 52.517389 13.3951309
## 484 0 0 53.479489 -2.2451148
## 485 0 0 38.974390 1.4197463
## 486 0 0 49.453872 11.0772980
## 487 0 0 41.150219 -8.6103497
## 488 0 0 50.059629 14.4464593
## 489 1 0 41.382580 2.1770730
## 490 1 0 53.479489 -2.2451148
## 491 0 0 51.507446 -0.1277653
## 492 0 0 53.479489 -2.2451148
## 493 1 0 51.886965 0.2441929
## 494 1 0 40.416782 -3.7035070
## 495 0 0 51.544096 -0.0040005
## 496 0 0 41.382580 2.1770730
## 497 1 1 40.835885 14.2487679
## 498 1 0 53.349379 -6.2605593
## 499 1 0 53.349379 -6.2605593
## 500 1 0 39.949257 4.0499642
## 501 1 0 45.437191 12.3345898
## 502 1 0 51.197090 -0.6943123
## 503 1 0 27.958000 -15.6062305
## 504 1 0 51.626730 6.2011559
## 505 1 0 50.846557 4.3516970
## 506 0 0 47.798135 13.0464806
## 507 1 0 53.349379 -6.2605593
## 508 0 0 51.481655 -3.1791934
## 509 0 0 52.517389 13.3951309
## 510 1 0 50.846557 4.3516970
## 511 1 0 41.893320 12.4829321
## 512 0 0 41.893320 12.4829321
## 513 1 0 44.493820 11.3426327
## 514 0 0 50.059629 14.4464593
## 515 1 0 53.479489 -2.2451148
## 516 0 0 53.349379 -6.2605593
## 517 0 0 51.538824 0.7128137
## 518 0 0 50.110644 8.6820917
## 519 1 0 41.125784 16.8620293
## 520 1 0 38.974390 1.4197463
## 521 1 0 41.382580 2.1770730
## 522 1 0 53.349379 -6.2605593
## 523 1 0 53.349379 -6.2605593
## 524 0 0 51.507446 -0.1277653
## 525 0 0 50.110644 8.6820917
## 526 1 0 53.479489 -2.2451148
## 527 0 0 38.974390 1.4197463
## 528 1 0 55.953346 -3.1883749
## 529 1 0 41.893320 12.4829321
## 530 0 0 42.649103 18.0939501
## 531 1 0 52.517389 13.3951309
## 532 0 0 53.550341 10.0006540
## 533 1 0 51.886965 0.2441929
## 534 1 0 53.349379 -6.2605593
## 535 1 0 45.464194 9.1896346
## 536 1 0 52.373080 4.8924534
## 537 1 0 41.893320 12.4829321
## 538 0 0 37.149805 -91.4328245
## 539 0 0 41.382580 2.1770730
## 540 0 0 37.149805 -91.4328245
## 541 0 0 41.382580 2.1770730
## 542 1 0 44.436141 26.1027202
## 543 1 0 44.841225 -0.5800364
## 544 1 0 33.959768 -83.3763980
## 545 0 0 50.938361 6.9599740
## 546 0 0 34.774399 32.4231586
## 547 1 0 55.686724 12.5700724
## 548 1 0 53.349379 -6.2605593
## 549 0 0 53.797418 -1.5437941
## 550 1 0 51.886965 0.2441929
## 551 1 0 53.797418 -1.5437941
## 552 1 0 36.407111 25.4566637
## 553 0 0 47.497879 19.0402383
## 554 0 0 39.613432 2.8829185
## 555 1 0 41.893320 12.4829321
## 556 1 0 33.959768 -83.3763980
## 557 0 0 51.886965 0.2441929
## 558 1 0 51.886965 0.2441929
## 559 0 0 41.382580 2.1770730
## 560 1 0 43.471472 10.6797912
## 561 1 0 38.343637 -0.4881708
## 562 1 1 51.453802 -2.5972985
## 563 1 0 41.382580 2.1770730
## 564 1 0 51.886965 0.2441929
## 565 1 0 52.233374 21.0711489
## 566 0 0 38.343637 -0.4881708
## 567 0 0 41.382580 2.1770730
## 568 0 0 47.497879 19.0402383
## 569 0 0 53.479489 -2.2451148
## 570 1 0 37.016294 -7.9351820
## 571 1 0 53.479489 -2.2451148
## 572 0 0 37.016294 -7.9351820
## 573 1 0 50.725614 -3.5269209
## 574 0 0 54.597580 -5.9277097
## 575 1 0 41.382580 2.1770730
## 576 1 0 51.544096 -0.0040005
## 577 0 0 51.507446 -0.1277653
## 578 1 0 38.707751 -9.1365919
## 579 1 0 37.739340 -25.6689503
## 580 0 0 51.891073 -0.4230304
## 581 1 0 51.886965 0.2441929
## 582 1 0 53.349379 -6.2605593
## 583 0 0 51.878102 -0.3664255
## 584 1 0 47.497879 19.0402383
## 585 1 0 34.021845 -6.8408929
## 586 0 0 37.016294 -7.9351820
## 587 0 0 49.430100 2.0823355
## 588 0 0 51.197090 -0.6943123
## 589 0 0 33.959768 -83.3763980
## 590 0 0 51.886965 0.2441929
## 591 1 0 51.886965 0.2441929
## 592 1 0 53.794799 -8.9193547
## 593 1 0 47.497879 19.0402383
## 594 1 0 52.479699 -1.9026911
## 595 1 0 48.584614 7.7507127
## 596 1 0 51.886965 0.2441929
## 597 1 0 41.382580 2.1770730
## 598 1 0 53.866650 -1.6567819
## 599 0 0 27.958000 -15.6062305
## 600 1 0 55.724702 9.1195835
## 601 1 0 51.886965 0.2441929
## 602 0 0 42.310262 13.9575901
## 603 0 0 52.479699 -1.9026911
## 604 0 0 55.953346 -3.1883749
## 605 1 0 41.382580 2.1770730
## 606 0 0 53.349379 -6.2605593
## 607 1 0 51.891073 -0.4230304
## 608 1 0 53.479489 -2.2451148
## 609 1 0 53.349379 -6.2605593
## 610 0 0 44.436141 26.1027202
## 611 1 0 41.150219 -8.6103497
## 612 1 0 53.479489 -2.2451148
## 613 0 0 47.497879 19.0402383
## 614 1 0 53.479489 -2.2451148
## 615 0 0 53.349379 -6.2605593
## 616 0 0 50.720151 -1.8799118
## 617 1 0 55.953346 -3.1883749
## 618 0 0 41.893320 12.4829321
## 619 1 0 40.835885 14.2487679
## 620 1 0 41.382580 2.1770730
## 621 0 0 36.407111 25.4566637
## 622 0 0 40.416782 -3.7035070
## 623 1 0 52.517389 13.3951309
## 624 0 0 51.389344 -0.0559576
## 625 1 0 52.373080 4.8924534
## 626 0 0 43.471472 10.6797912
## 627 1 0 41.150219 -8.6103497
## 628 1 0 50.450034 30.5241361
## 629 0 0 39.569582 2.6500745
## 630 0 0 50.059629 14.4464593
## 631 1 0 37.016294 -7.9351820
## 632 1 0 33.959768 -83.3763980
## 633 0 0 44.853457 0.4875310
## 634 0 0 41.382580 2.1770730
## 635 1 0 33.959768 -83.3763980
## 636 0 0 37.992379 -1.1305431
## 637 1 0 53.349379 -6.2605593
## 638 1 0 51.886965 0.2441929
## 639 1 0 51.197090 -0.6943123
## 640 1 0 53.479489 -2.2451148
## 641 0 0 38.707751 -9.1365919
## 642 1 0 55.686724 12.5700724
## 643 1 0 51.886965 0.2441929
## 644 1 0 41.150219 -8.6103497
## 645 0 0 45.607370 9.5418715
## 646 1 0 48.208354 16.3725042
## 647 0 0 51.389344 -0.0559576
## 648 1 0 38.707751 -9.1365919
## 649 0 0 50.846557 4.3516970
## 650 1 0 46.769379 23.5899542
## 651 0 0 36.721303 -4.4216366
## 652 1 0 51.891073 -0.4230304
## 653 0 0 55.953346 -3.1883749
## 654 1 0 50.846557 4.3516970
## 655 1 0 45.464194 9.1896346
## 656 1 0 51.886965 0.2441929
## 657 1 0 51.891073 -0.4230304
## 658 0 0 37.016294 -7.9351820
## 659 1 0 51.886965 0.2441929
## 660 1 0 41.893320 12.4829321
## 661 1 0 45.437191 12.3345898
## 662 0 0 52.517389 13.3951309
## 663 0 0 54.597580 -5.9277097
## 664 1 0 55.953346 -3.1883749
## 665 1 1 51.886965 0.2441929
## 666 0 0 53.866650 -1.6567819
## 667 0 0 35.888599 14.4476911
## 668 0 0 51.197090 -0.6943123
## 669 1 0 52.517389 13.3951309
## 670 1 0 39.591337 19.8596189
## 671 0 0 53.118818 -1.2597069
## 672 0 0 51.507446 -0.1277653
## 673 1 0 44.436141 26.1027202
## 674 0 0 52.517389 13.3951309
## 675 1 0 45.607370 9.5418715
## 676 1 0 53.349379 -6.2605593
## 677 0 0 51.453802 -2.5972985
## 678 0 0 55.686724 12.5700724
## 679 0 0 51.389344 -0.0559576
## 680 0 0 50.061947 19.9368564
## 681 1 0 38.343637 -0.4881708
## 682 1 0 51.886965 0.2441929
## 683 1 0 44.493820 11.3426327
## 684 0 0 53.479489 -2.2451148
## 685 1 0 54.348291 18.6540233
## 686 1 0 36.407111 25.4566637
## 687 0 0 53.349379 -6.2605593
## 688 1 0 36.407111 25.4566637
## 689 1 0 51.878102 -0.3664255
## 690 0 0 57.707233 11.9670171
## 691 1 0 51.197090 -0.6943123
## 692 1 0 35.512083 24.0191544
## 693 1 0 53.349379 -6.2605593
## 694 1 0 51.886965 0.2441929
## 695 0 0 48.137108 11.5753822
## 696 1 0 53.479489 -2.2451148
## 697 1 0 41.382580 2.1770730
## 698 1 0 39.581252 2.7092683
## 699 1 0 51.538824 0.7128137
## 700 1 0 53.407199 -2.9916800
## 701 1 0 40.416782 -3.7035070
## 702 1 0 53.479489 -2.2451148
## 703 1 0 53.349379 -6.2605593
## 704 1 0 41.382580 2.1770730
## 705 1 0 50.059629 14.4464593
## 706 0 0 53.479489 -2.2451148
## 707 0 0 36.721303 -4.4216366
## 708 1 0 53.118818 -1.2597069
## 709 0 0 50.938361 6.9599740
## 710 0 0 52.517389 13.3951309
## 711 1 0 53.118818 -1.2597069
## 712 1 0 37.016294 -7.9351820
## 713 1 0 45.464194 9.1896346
## 714 1 0 35.888599 14.4476911
## 715 1 0 52.517389 13.3951309
## 716 0 0 44.436141 26.1027202
## 717 0 0 51.891073 -0.4230304
## 718 0 0 55.498280 -4.6113017
## 719 0 0 44.493820 11.3426327
## 720 1 0 50.059629 14.4464593
## 721 1 0 51.898514 -8.4726423
## 722 0 0 51.544096 -0.0040005
## 723 1 0 44.436141 26.1027202
## 724 1 0 28.293578 -16.6214471
## 725 1 0 41.382580 2.1770730
## 726 0 0 38.343637 -0.4881708
## 727 0 0 53.479489 -2.2451148
## 728 1 0 53.349379 -6.2605593
## 729 0 0 51.886965 0.2441929
## 730 0 0 50.061947 19.9368564
## 731 0 0 51.886965 0.2441929
## 732 1 0 31.951569 35.9239625
## 733 0 0 51.225402 6.7763137
## 734 0 0 52.233374 21.0711489
## 735 0 0 53.075820 8.8071646
## 736 1 0 50.059629 14.4464593
## 737 1 0 39.581252 2.7092683
## 738 1 0 41.382580 2.1770730
## 739 0 0 38.111227 13.3524434
## 740 1 0 51.886965 0.2441929
## 741 1 0 33.959768 -83.3763980
## 742 0 0 49.418616 2.0958657
## 743 1 0 33.959768 -83.3763980
## 744 1 0 51.886965 0.2441929
## 745 1 0 38.707751 -9.1365919
## 746 0 0 53.479489 -2.2451148
## 747 1 0 55.953346 -3.1883749
## 748 1 0 53.479489 -2.2451148
## 749 1 0 39.581252 2.7092683
## 750 0 0 41.382580 2.1770730
## 751 0 0 36.721303 -4.4216366
## 752 1 0 38.974390 1.4197463
## 753 1 0 55.498280 -4.6113017
## 754 1 0 51.544096 -0.0040005
## 755 0 0 41.382580 2.1770730
## 756 0 0 50.059629 14.4464593
## 757 0 0 40.640317 22.9352716
## 758 1 0 44.841225 -0.5800364
## 759 1 0 41.893320 12.4829321
## 760 1 0 50.110644 8.6820917
## 761 0 0 51.891073 -0.4230304
## 762 1 0 51.891073 -0.4230304
## 763 1 0 40.416782 -3.7035070
## 764 1 0 52.408266 16.9335199
## 765 1 0 51.507446 -0.1277653
## 766 0 0 55.686724 12.5700724
## 767 1 0 51.886965 0.2441929
## 768 1 0 33.959768 -83.3763980
## 769 0 0 44.436141 26.1027202
## 770 0 0 28.293578 -16.6214471
## 771 0 0 59.325117 18.0710935
## 772 1 1 53.349379 -6.2605593
## 773 0 0 51.886965 0.2441929
## 774 1 0 53.797418 -1.5437941
## 775 0 0 41.382580 2.1770730
## 776 0 0 51.626730 6.2011559
## 777 1 1 51.886965 0.2441929
## 778 0 0 51.891073 -0.4230304
## 779 1 0 45.806691 12.2063158
## 780 1 0 53.118818 -1.2597069
## 781 1 0 51.891073 -0.4230304
## 782 0 0 44.493820 11.3426327
## 783 0 0 51.886965 0.2441929
## 784 1 0 49.418616 2.0958657
## 785 1 0 50.450034 30.5241361
## 786 0 0 36.721303 -4.4216366
## 787 1 0 41.382580 2.1770730
## 788 1 0 50.938361 6.9599740
## 789 1 0 41.893320 12.4829321
## 790 0 0 53.349379 -6.2605593
## 791 1 0 43.471472 10.6797912
## 792 0 0 40.835885 14.2487679
## 793 0 0 38.111227 13.3524434
## 794 1 0 37.016294 -7.9351820
## 795 0 0 50.938361 6.9599740
## 796 0 0 33.959768 -83.3763980
## 797 1 0 51.891073 -0.4230304
## 798 0 0 50.110644 8.6820917
## 799 1 0 40.416782 -3.7035070
## 800 0 0 50.110644 8.6820917
## 801 0 0 55.686724 12.5700724
## 802 1 0 51.448557 5.4501225
## 803 1 0 51.886965 0.2441929
## 804 0 0 36.407111 25.4566637
## 805 1 0 47.497879 19.0402383
## 806 0 0 41.382580 2.1770730
## 807 1 0 50.720151 -1.8799118
## 808 0 0 43.480119 13.2187279
## 809 0 0 52.373080 4.8924534
## 810 1 0 33.959768 -83.3763980
## 811 1 0 50.059629 14.4464593
## 812 0 0 53.349379 -6.2605593
## 813 1 0 33.959768 -83.3763980
## 814 0 0 41.893320 12.4829321
## 815 0 0 53.349379 -6.2605593
## 816 1 0 41.893320 12.4829321
## 817 0 0 53.349379 -6.2605593
## 818 1 0 48.853495 2.3483915
## 819 0 0 37.016294 -7.9351820
## 820 0 0 37.388630 -5.9953403
## 821 1 0 42.697703 23.3217359
## 822 1 0 33.959768 -83.3763980
## 823 0 0 39.591337 19.8596189
## 824 1 0 40.640317 22.9352716
## 825 1 0 36.721303 -4.4216366
## 826 1 0 51.886965 0.2441929
## 827 1 0 38.707751 -9.1365919
## 828 1 0 53.118818 -1.2597069
## 829 0 0 50.110644 8.6820917
## 830 0 0 51.886965 0.2441929
## 831 0 0 47.497879 19.0402383
## 832 1 0 33.959768 -83.3763980
## 833 1 0 41.382580 2.1770730
## 834 1 0 51.886965 0.2441929
## 835 0 0 51.886965 0.2441929
## 836 1 0 45.464194 9.1896346
## 837 1 0 42.880422 -8.5458608
## 838 0 0 48.151699 17.1093063
## 839 0 0 51.886965 0.2441929
## 840 0 0 51.886965 0.2441929
## 841 0 0 38.974390 1.4197463
## 842 1 0 51.514227 7.4652789
## 843 1 0 40.640317 22.9352716
## 844 0 0 53.075820 8.8071646
## 845 1 0 33.959768 -83.3763980
## 846 1 0 52.233374 21.0711489
## 847 1 0 51.886965 0.2441929
## 848 1 0 51.453802 -2.5972985
## 849 1 0 40.835885 14.2487679
## 850 1 0 50.938361 6.9599740
## 851 1 0 51.886965 0.2441929
## 852 1 0 52.517389 13.3951309
## 853 0 0 47.497879 19.0402383
## 854 0 0 48.151699 17.1093063
## 855 0 0 51.886965 0.2441929
## 856 1 0 41.893320 12.4829321
## 857 0 0 44.436141 26.1027202
## 858 1 0 51.886965 0.2441929
## 859 0 0 51.886965 0.2441929
## 860 1 0 33.959768 -83.3763980
## 861 0 0 44.436141 26.1027202
## 862 0 0 41.893320 12.4829321
## 863 0 0 50.938361 6.9599740
## 864 1 0 51.886965 0.2441929
## 865 0 0 43.604464 1.4442433
## 866 0 0 38.974390 1.4197463
## 867 1 0 53.428292 -6.2472741
## 868 0 0 40.640317 22.9352716
## 869 1 0 41.893320 12.4829321
## 870 1 0 34.774399 32.4231586
## 871 1 0 39.569582 2.6500745
## 872 0 0 51.886965 0.2441929
## 873 1 0 51.886965 0.2441929
## 874 1 0 51.507446 -0.1277653
## 875 0 0 50.867782 7.1389610
## 876 1 0 34.774399 32.4231586
## 877 0 0 43.471472 10.6797912
## 878 1 0 44.493820 11.3426327
## 879 0 0 45.437191 12.3345898
## 880 1 0 33.959768 -83.3763980
## 881 1 0 55.686724 12.5700724
## 882 1 0 43.471472 10.6797912
## 883 0 0 39.569582 2.6500745
## 884 0 0 40.640317 22.9352716
## 885 1 0 53.550341 10.0006540
## 886 1 0 41.382580 2.1770730
## 887 1 0 41.800289 12.6004706
## 888 1 0 41.125784 16.8620293
## 889 1 0 38.111227 13.3524434
## 890 1 0 50.846557 4.3516970
## 891 1 0 50.059629 14.4464593
## 892 0 0 33.959768 -83.3763980
## 893 0 0 53.349379 -6.2605593
## 894 1 0 40.640317 22.9352716
## 895 0 0 51.507446 -0.1277653
## 896 0 0 38.964507 16.3021451
## 897 1 0 51.886965 0.2441929
## 898 0 0 55.953346 -3.1883749
## 899 1 0 53.118818 -1.2597069
## 900 0 0 58.788758 16.9340863
## 901 1 0 51.886965 0.2441929
## 902 1 0 51.886965 0.2441929
## 903 0 0 41.382580 2.1770730
## 904 1 0 38.343637 -0.4881708
## 905 0 0 35.888599 14.4476911
## 906 1 0 55.953346 -3.1883749
## 907 0 0 41.382580 2.1770730
## 908 0 0 50.938361 6.9599740
## 909 0 0 53.479489 -2.2451148
## 910 0 0 45.437191 12.3345898
## 911 1 0 52.553973 13.2919488
## 912 0 0 51.626730 6.2011559
## 913 0 0 38.707751 -9.1365919
## 914 0 0 41.893320 12.4829321
## 915 0 0 45.756656 9.7542192
## 916 1 0 50.846557 4.3516970
## 917 1 0 39.569582 2.6500745
## 918 0 0 52.517389 13.3951309
## 919 1 0 53.479489 -2.2451148
## 920 0 0 45.607370 9.5418715
## 921 1 0 53.349379 -6.2605593
## 922 0 0 55.861155 -4.2501687
## 923 0 0 45.508562 8.9209988
## 924 1 0 41.382580 2.1770730
## 925 1 0 59.913330 10.7389701
## 926 0 0 40.416782 -3.7035070
## 927 1 0 39.581252 2.7092683
## 928 1 0 45.437191 12.3345898
## 929 1 0 38.343637 -0.4881708
## 930 0 0 41.979301 2.8199439
## 931 1 0 39.613432 2.8829185
## 932 1 0 51.197090 -0.6943123
## 933 1 0 53.794799 -8.9193547
## 934 1 0 53.797418 -1.5437941
## 935 0 0 44.493820 11.3426327
## 936 1 0 37.149805 -91.4328245
## 937 1 0 52.517389 13.3951309
## 938 1 0 55.953346 -3.1883749
## 939 1 0 48.137108 11.5753822
## 940 1 0 37.388630 -5.9953403
## 941 1 0 40.416782 -3.7035070
## 942 1 0 51.886965 0.2441929
## 943 1 0 47.497879 19.0402383
## 944 1 0 53.349379 -6.2605593
## 945 1 0 37.451394 25.3923149
## 946 1 0 50.846557 4.3516970
## 947 1 0 45.464194 9.1896346
## 948 0 0 53.479489 -2.2451148
## 949 0 0 37.739340 -25.6689503
## 950 0 0 41.150219 -8.6103497
## 951 0 0 51.453802 -2.5972985
## 952 0 0 45.464194 9.1896346
## 953 0 0 42.697703 23.3217359
## 954 1 0 33.959768 -83.3763980
## 955 0 0 47.497879 19.0402383
## 956 0 0 51.886965 0.2441929
## 957 0 0 51.886965 0.2441929
## 958 1 0 53.866650 -1.6567819
## 959 1 0 51.453802 -2.5972985
## 960 0 0 37.016294 -7.9351820
## 961 1 0 38.707751 -9.1365919
## 962 1 0 41.800289 12.6004706
## 963 0 0 36.681694 -6.1377402
## 964 0 0 41.382580 2.1770730
## 965 0 0 51.250559 22.5701022
## 966 1 0 35.888599 14.4476911
## 967 1 0 48.632038 -2.0580178
## 968 1 0 53.479489 -2.2451148
## 969 1 0 44.116859 15.2353257
## 970 0 0 41.893320 12.4829321
## 971 0 0 56.949398 24.1051846
## 972 0 0 43.604464 1.4442433
## 973 1 0 41.893320 12.4829321
## 974 0 0 36.721303 -4.4216366
## 975 1 0 33.959768 -83.3763980
## 976 0 0 55.953346 -3.1883749
## 977 1 0 43.604464 1.4442433
## 978 1 0 51.544096 -0.0040005
## 979 1 1 48.151699 17.1093063
## 980 1 1 45.464194 9.1896346
## 981 1 0 33.959768 -83.3763980
## 982 1 0 41.893320 12.4829321
## 983 1 0 40.416782 -3.7035070
## 984 1 0 51.544096 -0.0040005
## 985 1 0 53.349379 -6.2605593
## 986 1 0 52.479699 -1.9026911
## 987 1 0 50.110644 8.6820917
## 988 0 0 51.544096 -0.0040005
## 989 1 0 53.479489 -2.2451148
## 990 0 0 53.349379 -6.2605593
## 991 1 0 53.349379 -6.2605593
## 992 0 0 53.349379 -6.2605593
## 993 0 0 53.797418 -1.5437941
## 994 0 0 55.861155 -4.2501687
## 995 1 0 59.437242 24.7572802
## 996 1 0 40.416782 -3.7035070
## 997 1 0 51.389344 -0.0559576
## 998 0 0 51.544096 -0.0040005
## 999 0 0 47.497879 19.0402383
## 1000 1 0 51.544096 -0.0040005
## 1001 0 0 50.938361 6.9599740
## 1002 0 0 40.640317 22.9352716
## 1003 1 0 53.479489 -2.2451148
## 1004 0 0 27.958000 -15.6062305
## 1005 1 0 33.959768 -83.3763980
## 1006 1 0 50.110644 8.6820917
## 1007 1 0 41.893320 12.4829321
## 1008 1 0 41.893320 12.4829321
## 1009 0 0 53.479489 -2.2451148
## 1010 1 0 33.959768 -83.3763980
## 1011 1 0 40.416782 -3.7035070
## 1012 0 0 59.913330 10.7389701
## 1013 1 0 55.861155 -4.2501687
## 1014 1 0 52.517389 13.3951309
## 1015 1 0 40.416782 -3.7035070
## 1016 0 0 54.348291 18.6540233
## 1017 0 0 27.958000 -15.6062305
## 1018 1 0 53.349379 -6.2605593
## 1019 0 0 41.382580 2.1770730
## 1020 1 0 53.797418 -1.5437941
## 1021 1 1 55.953346 -3.1883749
## 1022 0 0 41.652134 -0.8809428
## 1023 0 0 53.479489 -2.2451148
## 1024 1 0 51.886965 0.2441929
## 1025 1 0 55.861155 -4.2501687
## 1026 1 0 35.888599 14.4476911
## 1027 1 0 36.721303 -4.4216366
## 1028 0 0 53.118818 -1.2597069
## 1029 0 0 37.739340 -25.6689503
## 1030 1 0 45.464194 9.1896346
## 1031 1 0 41.382580 2.1770730
## 1032 1 0 41.150219 -8.6103497
## 1033 1 0 51.886965 0.2441929
## 1034 1 0 32.085300 34.7818064
## 1035 1 0 45.464194 9.1896346
## 1036 0 0 50.059629 14.4464593
## 1037 1 0 29.039708 -13.6362916
## 1038 0 0 42.441524 19.2621081
## 1039 1 0 33.959768 -83.3763980
## 1040 1 0 39.569582 2.6500745
## 1041 0 0 53.407199 -2.9916800
## 1042 1 0 41.382580 2.1770730
## 1043 0 0 52.479699 -1.9026911
## 1044 1 0 53.550341 10.0006540
## 1045 1 0 33.959768 -83.3763980
## 1046 1 0 47.497879 19.0402383
## 1047 0 0 36.721303 -4.4216366
## 1048 1 0 41.382580 2.1770730
## 1049 1 0 41.893320 12.4829321
## 1050 0 0 41.150219 -8.6103497
## 1051 1 0 47.497879 19.0402383
## 1052 1 0 55.686724 12.5700724
## 1053 1 0 51.886965 0.2441929
## 1054 1 0 51.197090 -0.6943123
## 1055 0 0 51.886965 0.2441929
## 1056 1 0 32.085300 34.7818064
## 1057 0 0 51.544096 -0.0040005
## 1058 1 0 53.349379 -6.2605593
## 1059 0 0 40.835885 14.2487679
## 1060 1 0 51.886965 0.2441929
## 1061 0 0 37.016294 -7.9351820
## 1062 1 1 51.507446 -0.1277653
## 1063 1 0 53.118818 -1.2597069
## 1064 0 0 51.544096 -0.0040005
## 1065 0 0 37.149805 -91.4328245
## 1066 0 0 41.893320 12.4829321
## 1067 1 0 38.111227 13.3524434
## 1068 0 0 51.453802 -2.5972985
## 1069 0 0 55.861155 -4.2501687
## 1070 1 0 51.886965 0.2441929
## 1071 1 0 51.197090 -0.6943123
## 1072 1 0 38.343637 -0.4881708
## 1073 1 0 51.886965 0.2441929
## 1074 1 0 51.886965 0.2441929
## 1075 1 0 41.382580 2.1770730
## 1076 1 0 55.861155 -4.2501687
## 1077 1 0 53.349379 -6.2605593
## 1078 0 0 53.479489 -2.2451148
## 1079 0 0 52.106323 0.6909612
## 1080 1 0 53.479489 -2.2451148
## 1081 1 0 53.407199 -2.9916800
## 1082 0 0 51.507446 -0.1277653
## 1083 0 0 53.118818 -1.2597069
## 1084 0 0 48.853495 2.3483915
## 1085 1 0 38.974390 1.4197463
## 1086 0 0 53.407199 -2.9916800
## 1087 1 0 55.953346 -3.1883749
## 1088 1 0 45.437191 12.3345898
## 1089 1 0 55.861155 -4.2501687
## 1090 1 0 41.893320 12.4829321
## 1091 1 0 39.569582 2.6500745
## 1092 1 0 53.550341 10.0006540
## 1093 1 1 43.471472 10.6797912
## 1094 1 0 39.591337 19.8596189
## 1095 0 0 51.886965 0.2441929
## 1096 1 0 55.953346 -3.1883749
## 1097 1 0 50.867782 7.1389610
## 1098 1 0 53.349379 -6.2605593
## 1099 0 0 53.479489 -2.2451148
## 1100 0 0 54.348291 18.6540233
## 1101 0 0 41.893320 12.4829321
## 1102 0 0 53.349379 -6.2605593
## 1103 0 0 53.407199 -2.9916800
## 1104 0 0 37.016294 -7.9351820
## 1105 0 0 53.794799 -8.9193547
## 1106 0 0 52.106323 0.6909612
## 1107 0 0 36.721303 -4.4216366
## 1108 0 0 51.891073 -0.4230304
## 1109 1 0 53.349379 -6.2605593
## 1110 0 0 40.835885 14.2487679
## 1111 0 0 51.544096 -0.0040005
## 1112 1 0 37.502361 15.0873718
## 1113 1 0 51.108978 17.0326689
## 1114 1 0 53.349379 -6.2605593
## 1115 0 0 40.835885 14.2487679
## 1116 1 0 51.544096 -0.0040005
## 1117 1 0 40.416782 -3.7035070
## 1118 0 0 53.479489 -2.2451148
## 1119 0 0 52.479699 -1.9026911
## 1120 0 0 40.416782 -3.7035070
## 1121 0 0 51.886965 0.2441929
## 1122 0 0 53.349379 -6.2605593
## 1123 0 0 45.753836 21.2257474
## 1124 1 0 41.979301 2.8199439
## 1125 1 0 59.325117 18.0710935
## 1126 1 0 42.697703 23.3217359
## 1127 0 0 53.349379 -6.2605593
## 1128 1 0 39.569582 2.6500745
## 1129 1 0 47.986310 10.1808016
## 1130 1 0 52.517389 13.3951309
## 1131 1 0 49.430100 2.0823355
## 1132 1 0 52.517389 13.3951309
## 1133 1 0 36.407111 25.4566637
## 1134 0 0 33.959768 -83.3763980
## 1135 1 0 53.349379 -6.2605593
## 1136 1 0 55.953346 -3.1883749
## 1137 0 0 41.893320 12.4829321
## 1138 0 0 53.479489 -2.2451148
## 1139 0 0 53.479489 -2.2451148
## 1140 0 0 39.591337 19.8596189
## 1141 1 0 52.450886 20.6489881
## 1142 0 0 38.111227 13.3524434
## 1143 1 0 53.479489 -2.2451148
## 1144 0 0 51.544096 -0.0040005
## 1145 1 0 46.580260 0.3401960
## 1146 0 0 55.953346 -3.1883749
## 1147 1 0 37.451394 25.3923149
## 1148 1 0 51.507446 -0.1277653
## 1149 1 0 51.453802 -2.5972985
## 1150 1 0 51.886965 0.2441929
## 1151 0 0 51.544096 -0.0040005
## 1152 1 0 50.867782 7.1389610
## 1153 0 0 51.886965 0.2441929
## 1154 0 0 51.886965 0.2441929
## 1155 1 0 37.992379 -1.1305431
## 1156 1 0 51.448557 5.4501225
## 1157 1 0 51.886965 0.2441929
## 1158 0 0 37.992379 -1.1305431
## 1159 0 0 37.016294 -7.9351820
## 1160 0 0 44.493820 11.3426327
## 1161 1 0 53.866650 -1.6567819
## 1162 1 0 51.886965 0.2441929
## 1163 1 0 55.953346 -3.1883749
## 1164 0 0 51.886965 0.2441929
## 1165 0 0 43.213036 2.3491069
## 1166 0 0 43.213036 2.3491069
## 1167 0 0 51.886965 0.2441929
## 1168 0 0 44.436141 26.1027202
## 1169 0 0 52.502539 -3.2573033
## 1170 0 0 51.886965 0.2441929
## 1171 0 0 50.100869 8.6748912
## 1172 1 0 51.453802 -2.5972985
## 1173 1 0 53.349379 -6.2605593
## 1174 0 0 51.197090 -0.6943123
## 1175 0 0 53.349379 -6.2605593
## 1176 1 0 51.507446 -0.1277653
## 1177 0 0 36.407111 25.4566637
## 1178 0 0 55.502305 -4.5775966
## 1179 1 0 53.479489 -2.2451148
## 1180 1 0 37.739340 -25.6689503
## 1181 1 0 38.707751 -9.1365919
## 1182 1 0 53.407199 -2.9916800
## 1183 0 0 53.349379 -6.2605593
## 1184 0 0 33.959768 -83.3763980
## 1185 0 0 37.016294 -7.9351820
## 1186 1 0 41.248962 -8.6802796
## 1187 1 0 55.953346 -3.1883749
## 1188 1 0 33.959768 -83.3763980
## 1189 0 0 53.349379 -6.2605593
## 1190 0 0 37.739340 -25.6689503
## 1191 1 0 38.707751 -9.1365919
## 1192 1 0 52.479699 -1.9026911
## 1193 0 0 50.720151 -1.8799118
## 1194 0 0 53.794799 -8.9193547
## 1195 0 0 39.357562 -82.0609557
## 1196 0 0 41.382580 2.1770730
## 1197 1 0 41.882782 12.4887255
## 1198 0 0 53.428292 -6.2472741
## 1199 1 0 28.046141 -16.5720078
## 1200 0 0 55.950129 -3.3595080
## 1201 1 0 41.882782 12.4887255
## 1202 1 0 54.193680 -4.5591148
## 1203 1 0 53.428292 -6.2472741
## 1204 0 0 36.678545 -4.4999552
## 1205 0 0 51.886965 0.2441929
## 1206 1 0 53.428292 -6.2472741
## 1207 1 0 55.350000 23.7499997
## 1208 1 0 55.686724 12.5700724
## 1209 1 0 47.435273 19.2535106
## 1210 0 0 49.454322 2.1116687
## 1211 0 0 55.870556 -4.4357037
## 1212 0 0 54.193680 -4.5591148
## 1213 1 0 51.886965 0.2441929
## 1214 1 0 41.382580 2.1770730
## 1215 1 0 51.886965 0.2441929
## 1216 1 0 52.546193 21.2073404
## 1217 1 0 38.780954 -9.1319006
## 1218 1 0 41.799547 12.5912711
## 1219 0 0 54.652656 -6.2287441
## 1220 1 0 38.780954 -9.1319006
## 1221 1 0 37.739340 -25.6689503
## 1222 0 0 51.886965 0.2441929
## 1223 0 0 54.193680 -4.5591148
## 1224 1 0 47.435273 19.2535106
## 1225 0 0 41.799547 12.5912711
## 1226 0 0 41.248962 -8.6802796
## 1227 0 0 38.780954 -9.1319006
## 1228 1 0 51.886965 0.2441929
## 1229 1 0 53.428292 -6.2472741
## 1230 1 0 51.886965 0.2441929
## 1231 1 0 25.773771 55.9382320
## 1232 0 0 52.546193 21.2073404
## 1233 0 0 55.686724 12.5700724
## 1234 0 0 38.284418 -0.5657529
## 1235 1 0 53.045342 8.7896417
## 1236 0 0 51.886965 0.2441929
## 1237 0 0 51.382970 -2.7186238
## 1238 1 0 51.886965 0.2441929
## 1239 1 0 44.825226 0.5165843
## 1240 0 0 41.882782 12.4887255
## 1241 1 0 53.428292 -6.2472741
## 1242 0 0 50.463637 4.4661733
## 1243 0 0 54.193680 -4.5591148
## 1244 1 0 38.872948 1.3703724
## 1245 1 0 45.670894 9.6987542
## 1246 0 0 55.950129 -3.3595080
## 1247 1 0 53.428292 -6.2472741
## 1248 0 0 46.850610 1.7047947
## 1249 0 0 52.546193 21.2073404
## 1250 0 0 51.506597 -0.0263444
## 1251 1 0 48.170844 17.2100407
## 1252 1 0 40.416782 -3.7035070
## 1253 0 0 44.534431 11.2884470
## 1254 0 0 66.069879 22.6978451
## 1255 0 0 55.350000 23.7499997
## 1256 1 0 52.546193 21.2073404
## 1257 0 0 15.187167 120.5574650
## 1258 1 0 41.248962 -8.6802796
## 1259 0 0 39.105639 -83.0611404
## 1260 0 0 51.382970 -2.7186238
## 1261 1 0 51.841738 -8.4937985
## 1262 0 0 54.193680 -4.5591148
## 1263 0 0 51.886965 0.2441929
## 1264 0 0 52.698684 -8.9215548
## 1265 0 0 39.553225 2.7290310
## 1266 1 0 36.678545 -4.4999552
## 1267 0 0 51.886965 0.2441929
## 1268 1 0 51.886965 0.2441929
## 1269 1 0 51.886965 0.2441929
## 1270 1 0 53.336052 -2.8494284
## 1271 0 0 39.105639 -83.0611404
## 1272 0 0 28.447124 -13.8661476
## 1273 0 0 40.519802 22.9740868
## 1274 0 0 40.519802 22.9740868
## 1275 1 0 40.461561 9.1898290
## 1276 0 0 53.336052 -2.8494284
## 1277 0 0 51.382970 -2.7186238
## 1278 0 0 54.193680 -4.5591148
## 1279 1 0 -23.316593 -58.1693445
## 1280 0 0 53.428292 -6.2472741
## 1281 0 0 54.193680 -4.5591148
## 1282 1 0 39.357562 -82.0609557
## 1283 1 0 41.382580 2.1770730
## 1284 0 0 54.652656 -6.2287441
## 1285 0 0 55.950129 -3.3595080
## 1286 1 0 51.886965 0.2441929
## 1287 0 0 50.782380 -1.8399201
## 1288 0 0 50.900900 4.4809649
## 1289 0 0 51.886965 0.2441929
## 1290 0 0 54.193680 -4.5591148
## 1291 0 0 38.780954 -9.1319006
## 1292 1 0 55.350000 23.7499997
## 1293 1 0 53.428292 -6.2472741
## 1294 0 0 39.105639 -83.0611404
## 1295 0 0 52.698684 -8.9215548
## 1296 1 0 55.350000 23.7499997
## 1297 0 0 51.886965 0.2441929
## 1298 1 0 53.336052 -2.8494284
## 1299 1 0 51.382970 -2.7186238
## 1300 0 0 39.105639 -83.0611404
## 1301 1 0 40.416782 -3.7035070
## 1302 1 0 51.886965 0.2441929
## 1303 0 0 53.428292 -6.2472741
## 1304 0 0 51.886965 0.2441929
## 1305 1 0 41.882782 12.4887255
## 1306 0 0 39.553225 2.7290310
## 1307 1 0 52.546193 21.2073404
## 1308 0 0 51.506597 -0.0263444
## 1309 1 0 51.506597 -0.0263444
## 1310 1 0 36.678545 -4.4999552
## 1311 0 0 53.866650 -1.6567819
## 1312 0 0 54.193680 -4.5591148
## 1313 0 0 40.416782 -3.7035070
## 1314 0 0 51.886965 0.2441929
## 1315 1 0 50.463637 4.4661733
## 1316 1 0 53.428292 -6.2472741
## 1317 0 0 51.154077 -0.1823226
## 1318 1 0 17.666667 -100.0000000
## 1319 0 0 55.350000 23.7499997
## 1320 1 0 39.357562 -82.0609557
## 1321 1 0 55.870556 -4.4357037
## 1322 0 0 37.417703 -5.8949287
## 1323 1 0 38.284418 -0.5657529
## 1324 0 0 51.841738 -8.4937985
## 1325 1 0 55.686724 12.5700724
## 1326 0 0 53.428292 -6.2472741
## 1327 0 0 55.950129 -3.3595080
## 1328 0 0 52.454185 -1.7438663
## 1329 0 0 -23.316593 -58.1693445
## 1330 0 0 48.170844 17.2100407
## 1331 0 0 40.461561 9.1898290
## 1332 1 0 38.780954 -9.1319006
## 1333 1 0 41.382580 2.1770730
## 1334 1 0 50.867782 7.1389610
## 1335 1 0 51.841738 -8.4937985
## 1336 1 0 40.416782 -3.7035070
## 1337 0 0 50.463637 4.4661733
## 1338 1 0 51.506597 -0.0263444
## 1339 1 0 50.900900 4.4809649
## 1340 0 0 45.649090 12.1966848
## 1341 0 0 55.350000 23.7499997
## 1342 1 0 53.428292 -6.2472741
## 1343 1 0 39.357562 -82.0609557
## 1344 1 0 55.950129 -3.3595080
## 1345 0 0 34.034653 -5.0161926
## 1346 0 0 51.886965 0.2441929
## 1347 0 0 55.740737 9.1603919
## 1348 1 0 50.463637 4.4661733
## 1349 0 0 51.506597 -0.0263444
## 1350 1 0 54.193680 -4.5591148
## 1351 0 0 25.773771 55.9382320
## 1352 1 0 53.797418 -1.5437941
## 1353 1 0 46.850610 1.7047947
## 1354 1 0 38.284418 -0.5657529
## 1355 0 0 52.454185 -1.7438663
## 1356 1 0 54.193680 -4.5591148
## 1357 0 0 52.326980 4.7415053
## 1358 0 0 55.350000 23.7499997
## 1359 1 0 53.428292 -6.2472741
## 1360 0 0 52.454185 -1.7438663
## 1361 0 0 41.382580 2.1770730
## 1362 0 0 55.686724 12.5700724
## 1363 1 0 41.815391 12.2264848
## 1364 0 0 36.743778 -6.0640495
## 1365 1 0 38.780954 -9.1319006
## 1366 0 0 27.930162 -15.3880130
## 1367 1 0 54.193680 -4.5591148
## 1368 1 0 53.428292 -6.2472741
## 1369 0 0 55.350000 23.7499997
## 1370 0 0 40.416782 -3.7035070
## 1371 1 0 52.454185 -1.7438663
## 1372 0 0 54.193680 -4.5591148
## 1373 1 0 50.463637 4.4661733
## 1374 1 0 51.603102 6.1433899
## 1375 1 0 55.686724 12.5700724
## 1376 0 0 52.479699 -1.9026911
## 1377 0 0 51.507446 -0.1277653
## 1378 1 0 45.670894 9.6987542
## 1379 0 0 53.349379 -6.2605593
## 1380 1 0 51.886965 0.2441929
## 1381 0 0 44.493820 11.3426327
## 1382 1 0 53.349379 -6.2605593
## 1383 0 0 53.407199 -2.9916800
## 1384 1 0 52.373080 4.8924534
## 1385 1 0 55.953346 -3.1883749
## 1386 0 0 53.349379 -6.2605593
## 1387 0 0 53.479489 -2.2451148
## 1388 1 0 53.349379 -6.2605593
## 1389 0 0 52.479699 -1.9026911
## 1390 1 0 51.507446 -0.1277653
## 1391 1 0 54.687046 25.2829111
## 1392 1 0 53.349379 -6.2605593
## 1393 1 0 28.400377 -14.0048697
## 1394 1 0 52.233374 21.0711489
## 1395 0 0 55.686724 12.5700724
## 1396 0 0 4.368549 97.0253024
## 1397 1 0 45.835424 1.2644847
## 1398 1 0 52.517389 13.3951309
## 1399 1 0 51.886965 0.2441929
## 1400 0 0 51.886965 0.2441929
## 1401 1 0 51.886965 0.2441929
## 1402 1 0 36.721303 -4.4216366
## 1403 1 0 51.886965 0.2441929
## 1404 0 0 28.293578 -16.6214471
## 1405 0 0 39.357562 -82.0609557
## 1406 0 0 53.479489 -2.2451148
## 1407 1 0 39.105639 -83.0611404
## 1408 1 0 41.382580 2.1770730
## 1409 1 0 55.861155 -4.2501687
## 1410 1 0 44.870228 13.8455311
## 1411 0 0 51.453802 -2.5972985
## 1412 1 0 50.110644 8.6820917
## 1413 1 0 50.900900 4.4809649
## 1414 1 0 41.382580 2.1770730
## 1415 1 0 51.886965 0.2441929
## 1416 0 0 33.959768 -83.3763980
## 1417 1 0 51.507446 -0.1277653
## 1418 0 0 50.846557 4.3516970
## 1419 0 0 44.537447 26.0826942
## 1420 0 0 43.471472 10.6797912
## 1421 1 0 51.448557 5.4501225
## 1422 0 0 44.351141 2.5728493
## 1423 0 0 41.125784 16.8620293
## 1424 1 0 49.944633 7.2612103
## 1425 1 0 43.627472 13.4032148
## 1426 1 0 51.886965 0.2441929
## 1427 1 0 55.953346 -3.1883749
## 1428 0 0 51.886965 0.2441929
## 1429 1 0 51.197090 -0.6943123
## 1430 1 0 51.154077 -0.1823226
## 1431 0 0 51.507446 -0.1277653
## 1432 0 0 38.343637 -0.4881708
## 1433 1 0 51.886965 0.2441929
## 1434 1 0 33.959768 -83.3763980
## 1435 0 0 27.958000 -15.6062305
## 1436 1 0 50.720151 -1.8799118
## 1437 0 0 51.886965 0.2441929
## 1438 1 0 53.479489 -2.2451148
## 1439 1 0 41.150219 -8.6103497
## 1440 1 0 53.479489 -2.2451148
## 1441 1 0 50.720151 -1.8799118
## 1442 1 0 39.553225 2.7290310
## 1443 1 0 40.416782 -3.7035070
## 1444 0 0 35.888599 14.4476911
## 1445 0 0 45.835424 1.2644847
## 1446 1 0 48.632038 -2.0580178
## 1447 1 0 33.959768 -83.3763980
## 1448 0 0 28.963968 -13.5499014
## 1449 1 0 53.349379 -6.2605593
## 1450 0 0 50.463637 4.4661733
## 1451 0 0 53.349379 -6.2605593
## 1452 1 0 52.479699 -1.9026911
## 1453 1 0 51.448557 5.4501225
## 1454 0 0 51.886965 0.2441929
## 1455 1 0 53.349379 -6.2605593
## 1456 1 0 39.553225 2.7290310
## 1457 1 0 11.191626 40.0197520
## 1458 0 0 51.507446 -0.1277653
## 1459 1 0 51.886965 0.2441929
## 1460 1 0 55.953346 -3.1883749
## 1461 1 0 -23.316593 -58.1693445
## 1462 0 0 36.681694 -6.1377402
## 1463 1 0 51.886965 0.2441929
## 1464 1 0 53.479489 -2.2451148
## 1465 1 0 39.591337 19.8596189
## 1466 1 0 53.407199 -2.9916800
## 1467 1 0 28.046141 -16.5720078
## 1468 1 0 39.569582 2.6500745
## 1469 0 0 36.721303 -4.4216366
## 1470 1 0 53.407199 -2.9916800
## 1471 1 0 53.349379 -6.2605593
## 1472 0 0 51.382970 -2.7186238
## 1473 1 0 40.416782 -3.7035070
## 1474 1 0 53.407199 -2.9916800
## 1475 1 0 51.886965 0.2441929
## 1476 1 0 53.479489 -2.2451148
## 1477 0 0 55.686724 12.5700724
## 1478 0 0 49.944633 7.2612103
## 1479 0 0 53.407199 -2.9916800
## 1480 0 0 41.382580 2.1770730
## 1481 1 0 39.469707 -0.3763353
## 1482 1 0 50.938361 6.9599740
## 1483 1 0 39.591337 19.8596189
## 1484 1 0 45.649648 13.7772781
## 1485 0 0 53.118818 -1.2597069
## 1486 1 0 33.959768 -83.3763980
## 1487 1 0 40.416782 -3.7035070
## 1488 0 0 52.479699 -1.9026911
## 1489 0 0 51.886965 0.2441929
## 1490 1 0 38.964507 16.3021451
## 1491 0 0 51.886965 0.2441929
## 1492 0 0 51.886965 0.2441929
## 1493 1 0 52.479699 -1.9026911
## 1494 1 0 51.886965 0.2441929
## 1495 1 0 51.886965 0.2441929
## 1496 1 0 51.891073 -0.4230304
## 1497 1 0 41.382580 2.1770730
## 1498 1 0 33.959768 -83.3763980
## 1499 1 0 38.707751 -9.1365919
## 1500 1 0 53.118818 -1.2597069
## 1501 0 0 41.382580 2.1770730
## 1502 0 0 44.116859 15.2353257
## 1503 1 0 51.886965 0.2441929
## 1504 0 0 50.100869 8.6748912
## 1505 0 0 28.963968 -13.5499014
## 1506 1 0 37.149805 -91.4328245
## 1507 0 0 51.886965 0.2441929
## 1508 1 0 50.061947 19.9368564
## 1509 1 0 39.569582 2.6500745
## 1510 0 0 50.720151 -1.8799118
## 1511 0 0 36.721303 -4.4216366
## 1512 1 0 50.059629 14.4464593
## 1513 1 0 43.561416 12.1650506
## 1514 1 0 59.325117 18.0710935
## 1515 1 0 39.469707 -0.3763353
## 1516 0 0 51.453802 -2.5972985
## 1517 0 0 52.233374 21.0711489
## 1518 0 0 53.479489 -2.2451148
## 1519 0 0 52.479699 -1.9026911
## 1520 0 0 52.106323 0.6909612
## 1521 0 0 55.502305 -4.5775966
## 1522 0 0 53.118818 -1.2597069
## 1523 1 0 53.866650 -1.6567819
## 1524 0 0 53.349379 -6.2605593
## 1525 0 0 50.100869 8.6748912
## 1526 0 0 38.284418 -0.5657529
## 1527 0 0 36.721303 -4.4216366
## 1528 1 0 45.806691 12.2063158
## 1529 1 0 55.953346 -3.1883749
## 1530 1 0 51.886965 0.2441929
## 1531 1 0 51.154077 -0.1823226
## 1532 0 0 51.886965 0.2441929
## 1533 0 0 53.118818 -1.2597069
## 1534 0 0 54.193680 -4.5591148
## 1535 1 0 41.893320 12.4829321
## 1536 1 0 53.479489 -2.2451148
## 1537 0 0 52.517389 13.3951309
## 1538 0 0 55.953346 -3.1883749
## 1539 0 0 51.886965 0.2441929
## 1540 1 0 43.461893 -3.8100255
## 1541 1 0 53.407199 -2.9916800
## 1542 0 0 50.846557 4.3516970
## 1543 0 0 53.349379 -6.2605593
## 1544 0 0 51.886965 0.2441929
## 1545 0 0 47.988824 10.2350723
## 1546 1 0 51.886965 0.2441929
## 1547 0 0 51.324831 0.2878764
## 1548 1 0 47.603237 7.5243481
## 1549 1 0 55.724702 9.1195835
## 1550 1 0 55.953346 -3.1883749
## 1551 1 0 53.479489 -2.2451148
## 1552 0 0 52.233374 21.0711489
## 1553 1 0 45.649648 13.7772781
## 1554 1 0 41.893320 12.4829321
## 1555 1 0 49.944633 7.2612103
## 1556 0 0 51.886965 0.2441929
## 1557 1 0 50.059629 14.4464593
## 1558 0 0 43.471472 10.6797912
## 1559 0 0 55.861155 -4.2501687
## 1560 1 0 51.507446 -0.1277653
## 1561 1 0 51.507446 -0.1277653
## 1562 0 0 50.846557 4.3516970
## 1563 0 0 53.118818 -1.2597069
## 1564 0 0 51.886965 0.2441929
## 1565 1 0 51.453802 -2.5972985
## 1566 1 0 51.389344 -0.0559576
## 1567 1 0 9.869479 -83.7980749
## 1568 0 0 53.407199 -2.9916800
## 1569 0 0 53.866650 -1.6567819
## 1570 1 0 53.045342 8.7896417
## 1571 0 0 51.544096 -0.0040005
## 1572 1 0 39.357562 -82.0609557
## 1573 0 0 36.678545 -4.4999552
## 1574 0 1 26.492533 92.3308789
## 1575 1 1 45.756656 9.7542192
## 1576 0 1 55.861155 -4.2501687
## 1577 1 1 52.450886 20.6489881
## 1578 1 1 51.886965 0.2441929
## 1579 1 1 51.886965 0.2441929
## 1580 0 1 51.886965 0.2441929
## 1581 0 1 26.492533 92.3308789
## 1582 0 1 26.492533 92.3308789
## 1583 0 1 26.492533 92.3308789
## 1584 0 1 26.492533 92.3308789
## 1585 0 1 26.492533 92.3308789
## 1586 0 1 26.492533 92.3308789
## 1587 0 1 26.492533 92.3308789
## 1588 0 1 26.492533 92.3308789
## 1589 0 1 26.492533 92.3308789
## 1590 0 1 26.492533 92.3308789
## 1591 0 1 26.492533 92.3308789
## 1592 0 1 26.492533 92.3308789
## 1593 0 1 26.492533 92.3308789
## 1594 0 1 26.492533 92.3308789
## 1595 0 1 26.492533 92.3308789
## 1596 0 1 26.492533 92.3308789
## 1597 0 1 26.492533 92.3308789
## 1598 0 1 26.492533 92.3308789
## 1599 0 1 26.492533 92.3308789
## 1600 0 1 26.492533 92.3308789
## 1601 0 1 26.492533 92.3308789
## 1602 0 1 26.492533 92.3308789
## 1603 0 1 26.492533 92.3308789
## 1604 0 1 26.492533 92.3308789
## 1605 0 1 26.492533 92.3308789
## 1606 0 1 26.492533 92.3308789
## 1607 0 1 26.492533 92.3308789
## 1608 0 1 26.492533 92.3308789
## 1609 0 1 26.492533 92.3308789
## 1610 0 1 26.492533 92.3308789
## 1611 0 1 26.492533 92.3308789
## 1612 0 1 26.492533 92.3308789
## 1613 0 1 26.492533 92.3308789
## 1614 0 1 26.492533 92.3308789
## 1615 0 1 26.492533 92.3308789
## 1616 0 1 26.492533 92.3308789
## 1617 0 1 26.492533 92.3308789
## 1618 0 1 26.492533 92.3308789
## 1619 0 1 26.492533 92.3308789
## 1620 0 1 26.492533 92.3308789
## 1621 0 1 26.492533 92.3308789
## 1622 0 1 26.492533 92.3308789
## 1623 0 1 26.492533 92.3308789
## 1624 0 1 26.492533 92.3308789
## 1625 0 1 26.492533 92.3308789
## 1626 0 1 26.492533 92.3308789
## 1627 0 1 26.492533 92.3308789
## 1628 0 1 26.492533 92.3308789
## 1629 0 1 26.492533 92.3308789
## 1630 0 1 26.492533 92.3308789
## 1631 0 1 26.492533 92.3308789
## 1632 0 1 26.492533 92.3308789
## 1633 0 1 26.492533 92.3308789
## 1634 0 1 26.492533 92.3308789
## 1635 0 1 26.492533 92.3308789
## 1636 0 1 26.492533 92.3308789
## 1637 0 1 26.492533 92.3308789
## 1638 0 1 26.492533 92.3308789
## 1639 0 1 26.492533 92.3308789
## 1640 0 1 26.492533 92.3308789
## 1641 0 1 26.492533 92.3308789
## 1642 0 1 26.492533 92.3308789
## 1643 0 1 26.492533 92.3308789
## 1644 0 1 26.492533 92.3308789
## 1645 0 1 26.492533 92.3308789
## 1646 0 1 26.492533 92.3308789
## 1647 0 1 26.492533 92.3308789
## 1648 0 1 26.492533 92.3308789
## 1649 0 1 26.492533 92.3308789
## 1650 0 1 26.492533 92.3308789
## 1651 0 1 26.492533 92.3308789
## 1652 0 1 26.492533 92.3308789
## 1653 0 1 26.492533 92.3308789
## 1654 0 1 26.492533 92.3308789
## 1655 0 1 26.492533 92.3308789
## 1656 0 1 26.492533 92.3308789
## 1657 0 1 26.492533 92.3308789
## 1658 0 1 26.492533 92.3308789
## 1659 0 1 26.492533 92.3308789
## 1660 0 1 26.492533 92.3308789
## 1661 0 1 26.492533 92.3308789
## 1662 0 1 26.492533 92.3308789
## 1663 0 1 26.492533 92.3308789
## 1664 0 1 26.492533 92.3308789
## 1665 0 1 26.492533 92.3308789
## 1666 0 1 26.492533 92.3308789
## 1667 0 1 26.492533 92.3308789
## 1668 0 1 26.492533 92.3308789
## 1669 0 1 26.492533 92.3308789
## 1670 0 1 26.492533 92.3308789
## 1671 0 1 26.492533 92.3308789
## 1672 0 1 26.492533 92.3308789
## 1673 0 1 26.492533 92.3308789
## 1674 0 1 26.492533 92.3308789
## 1675 0 1 26.492533 92.3308789
## 1676 0 1 26.492533 92.3308789
## 1677 0 1 26.492533 92.3308789
## 1678 0 1 26.492533 92.3308789
## 1679 0 1 26.492533 92.3308789
## 1680 0 1 26.492533 92.3308789
## 1681 0 1 26.492533 92.3308789
## 1682 0 1 26.492533 92.3308789
## 1683 0 1 26.492533 92.3308789
## 1684 0 1 26.492533 92.3308789
## 1685 0 1 26.492533 92.3308789
## 1686 0 1 26.492533 92.3308789
## 1687 0 1 26.492533 92.3308789
## 1688 0 1 26.492533 92.3308789
## 1689 0 1 26.492533 92.3308789
## 1690 0 1 26.492533 92.3308789
## 1691 0 1 26.492533 92.3308789
## 1692 0 1 26.492533 92.3308789
## 1693 0 1 26.492533 92.3308789
## 1694 0 1 26.492533 92.3308789
## 1695 0 1 26.492533 92.3308789
## 1696 0 1 26.492533 92.3308789
## 1697 0 1 26.492533 92.3308789
## 1698 0 1 26.492533 92.3308789
## 1699 0 1 26.492533 92.3308789
## 1700 0 1 26.492533 92.3308789
## 1701 0 1 26.492533 92.3308789
## 1702 0 1 26.492533 92.3308789
## 1703 0 1 26.492533 92.3308789
## 1704 0 1 26.492533 92.3308789
## 1705 0 1 26.492533 92.3308789
## 1706 0 1 26.492533 92.3308789
## 1707 0 1 26.492533 92.3308789
## 1708 0 1 26.492533 92.3308789
## 1709 0 1 26.492533 92.3308789
## 1710 0 1 26.492533 92.3308789
## 1711 0 1 26.492533 92.3308789
## 1712 0 1 26.492533 92.3308789
## 1713 0 1 26.492533 92.3308789
## 1714 0 1 26.492533 92.3308789
## 1715 0 1 26.492533 92.3308789
## 1716 0 1 26.492533 92.3308789
## 1717 0 1 26.492533 92.3308789
## 1718 0 1 26.492533 92.3308789
## 1719 0 1 26.492533 92.3308789
## 1720 0 1 26.492533 92.3308789
## 1721 0 1 26.492533 92.3308789
## 1722 0 1 26.492533 92.3308789
## 1723 0 1 26.492533 92.3308789
## 1724 0 1 26.492533 92.3308789
## 1725 0 1 26.492533 92.3308789
## 1726 0 1 26.492533 92.3308789
## 1727 0 1 26.492533 92.3308789
## 1728 0 1 26.492533 92.3308789
## 1729 0 1 26.492533 92.3308789
## 1730 0 1 26.492533 92.3308789
## 1731 0 1 26.492533 92.3308789
## 1732 0 1 26.492533 92.3308789
## 1733 0 1 26.492533 92.3308789
## 1734 0 1 26.492533 92.3308789
## 1735 0 1 26.492533 92.3308789
## 1736 0 1 26.492533 92.3308789
## 1737 0 1 26.492533 92.3308789
## 1738 0 1 26.492533 92.3308789
## 1739 0 1 26.492533 92.3308789
## 1740 0 1 26.492533 92.3308789
## 1741 0 1 26.492533 92.3308789
## 1742 0 1 26.492533 92.3308789
## 1743 0 1 26.492533 92.3308789
## 1744 0 1 26.492533 92.3308789
## 1745 0 1 26.492533 92.3308789
## 1746 0 1 26.492533 92.3308789
## 1747 0 1 26.492533 92.3308789
## 1748 0 1 26.492533 92.3308789
## 1749 0 1 26.492533 92.3308789
## 1750 0 1 26.492533 92.3308789
## 1751 0 1 26.492533 92.3308789
## 1752 0 1 26.492533 92.3308789
## 1753 0 1 26.492533 92.3308789
## 1754 0 1 26.492533 92.3308789
## 1755 0 1 26.492533 92.3308789
## 1756 0 1 26.492533 92.3308789
## 1757 0 1 26.492533 92.3308789
## 1758 0 1 26.492533 92.3308789
## 1759 0 1 26.492533 92.3308789
## 1760 0 1 26.492533 92.3308789
## 1761 0 1 26.492533 92.3308789
## 1762 0 1 26.492533 92.3308789
## 1763 0 1 26.492533 92.3308789
## 1764 0 1 26.492533 92.3308789
## 1765 0 1 26.492533 92.3308789
## 1766 0 1 26.492533 92.3308789
## 1767 0 1 26.492533 92.3308789
## 1768 0 1 26.492533 92.3308789
## 1769 0 1 26.492533 92.3308789
## 1770 0 1 26.492533 92.3308789
## 1771 0 1 26.492533 92.3308789
## 1772 0 1 26.492533 92.3308789
## 1773 0 1 26.492533 92.3308789
## 1774 0 1 26.492533 92.3308789
## 1775 0 1 26.492533 92.3308789
## 1776 0 1 26.492533 92.3308789
## 1777 0 1 26.492533 92.3308789
## 1778 0 1 26.492533 92.3308789
## 1779 0 1 26.492533 92.3308789
## 1780 0 1 26.492533 92.3308789
## 1781 0 1 26.492533 92.3308789
## 1782 0 1 26.492533 92.3308789
## 1783 0 1 26.492533 92.3308789
## 1784 0 1 26.492533 92.3308789
## 1785 0 1 26.492533 92.3308789
## 1786 0 1 26.492533 92.3308789
## 1787 0 1 26.492533 92.3308789
## 1788 0 1 26.492533 92.3308789
## 1789 0 1 26.492533 92.3308789
## 1790 0 1 26.492533 92.3308789
## 1791 0 1 26.492533 92.3308789
## 1792 0 1 26.492533 92.3308789
## 1793 0 1 26.492533 92.3308789
## 1794 0 1 26.492533 92.3308789
## 1795 0 1 26.492533 92.3308789
## 1796 0 1 26.492533 92.3308789
## 1797 0 1 26.492533 92.3308789
## 1798 0 1 26.492533 92.3308789
## 1799 0 1 26.492533 92.3308789
## 1800 0 1 26.492533 92.3308789
## 1801 0 1 26.492533 92.3308789
## 1802 0 1 26.492533 92.3308789
## 1803 0 1 26.492533 92.3308789
## 1804 0 1 26.492533 92.3308789
## 1805 0 1 26.492533 92.3308789
## 1806 0 1 26.492533 92.3308789
## 1807 0 1 26.492533 92.3308789
## 1808 0 1 26.492533 92.3308789
## 1809 0 1 26.492533 92.3308789
## 1810 0 1 26.492533 92.3308789
## 1811 0 1 26.492533 92.3308789
## 1812 0 1 26.492533 92.3308789
## 1813 0 1 26.492533 92.3308789
## 1814 0 1 26.492533 92.3308789
## 1815 0 1 26.492533 92.3308789
## 1816 0 1 26.492533 92.3308789
## 1817 0 1 26.492533 92.3308789
## 1818 0 1 26.492533 92.3308789
## 1819 0 1 26.492533 92.3308789
## 1820 0 1 26.492533 92.3308789
## 1821 0 1 26.492533 92.3308789
## 1822 0 1 26.492533 92.3308789
## 1823 0 1 26.492533 92.3308789
## 1824 0 1 26.492533 92.3308789
## 1825 0 1 26.492533 92.3308789
## 1826 0 1 26.492533 92.3308789
## 1827 0 1 26.492533 92.3308789
## 1828 0 1 26.492533 92.3308789
## 1829 0 1 26.492533 92.3308789
## 1830 0 1 26.492533 92.3308789
## 1831 0 1 26.492533 92.3308789
## 1832 0 1 26.492533 92.3308789
## 1833 0 1 26.492533 92.3308789
## 1834 0 1 26.492533 92.3308789
## 1835 0 1 26.492533 92.3308789
## 1836 0 1 26.492533 92.3308789
## 1837 0 1 26.492533 92.3308789
## 1838 0 1 26.492533 92.3308789
## 1839 0 1 26.492533 92.3308789
## 1840 0 1 26.492533 92.3308789
## 1841 0 1 26.492533 92.3308789
## 1842 0 1 26.492533 92.3308789
## 1843 0 1 26.492533 92.3308789
## 1844 0 1 26.492533 92.3308789
## 1845 0 1 26.492533 92.3308789
## 1846 0 1 26.492533 92.3308789
## 1847 0 1 26.492533 92.3308789
## 1848 0 1 26.492533 92.3308789
## 1849 0 1 26.492533 92.3308789
## 1850 0 1 26.492533 92.3308789
## 1851 0 1 26.492533 92.3308789
## 1852 0 1 26.492533 92.3308789
## 1853 0 1 26.492533 92.3308789
## 1854 0 1 26.492533 92.3308789
## 1855 0 1 26.492533 92.3308789
## 1856 0 1 26.492533 92.3308789
## 1857 0 1 26.492533 92.3308789
## 1858 0 1 26.492533 92.3308789
## 1859 0 1 26.492533 92.3308789
## 1860 0 1 26.492533 92.3308789
## 1861 0 1 26.492533 92.3308789
## 1862 0 1 26.492533 92.3308789
## 1863 0 1 26.492533 92.3308789
## 1864 0 1 26.492533 92.3308789
## 1865 0 1 26.492533 92.3308789
## 1866 0 1 26.492533 92.3308789
## 1867 0 1 26.492533 92.3308789
## 1868 0 1 26.492533 92.3308789
## 1869 0 1 26.492533 92.3308789
## 1870 0 1 26.492533 92.3308789
## 1871 0 1 26.492533 92.3308789
## 1872 0 1 26.492533 92.3308789
## 1873 0 1 26.492533 92.3308789
## 1874 0 1 26.492533 92.3308789
## 1875 0 1 26.492533 92.3308789
## 1876 0 1 26.492533 92.3308789
## 1877 0 1 26.492533 92.3308789
## 1878 0 1 26.492533 92.3308789
## 1879 0 1 26.492533 92.3308789
## 1880 0 1 26.492533 92.3308789
## 1881 0 1 26.492533 92.3308789
## 1882 0 1 26.492533 92.3308789
## 1883 0 1 26.492533 92.3308789
## 1884 0 1 26.492533 92.3308789
## 1885 0 1 26.492533 92.3308789
## 1886 0 1 26.492533 92.3308789
## 1887 0 1 26.492533 92.3308789
## 1888 0 1 26.492533 92.3308789
## 1889 0 1 26.492533 92.3308789
## 1890 0 1 26.492533 92.3308789
## 1891 0 1 26.492533 92.3308789
## 1892 0 1 26.492533 92.3308789
## 1893 0 1 26.492533 92.3308789
## 1894 0 1 26.492533 92.3308789
## 1895 0 1 26.492533 92.3308789
## 1896 0 1 26.492533 92.3308789
## 1897 0 1 26.492533 92.3308789
## 1898 0 1 26.492533 92.3308789
## 1899 0 1 26.492533 92.3308789
## 1900 0 1 26.492533 92.3308789
## 1901 0 1 26.492533 92.3308789
## 1902 0 1 26.492533 92.3308789
## 1903 0 1 26.492533 92.3308789
## 1904 0 1 26.492533 92.3308789
## 1905 0 1 26.492533 92.3308789
## 1906 0 1 26.492533 92.3308789
## 1907 0 1 26.492533 92.3308789
## 1908 0 1 26.492533 92.3308789
## 1909 0 1 26.492533 92.3308789
## 1910 0 1 26.492533 92.3308789
## 1911 0 1 26.492533 92.3308789
## 1912 0 1 26.492533 92.3308789
## 1913 0 1 26.492533 92.3308789
## 1914 0 1 26.492533 92.3308789
## 1915 0 1 26.492533 92.3308789
## 1916 0 1 26.492533 92.3308789
## 1917 0 1 26.492533 92.3308789
## 1918 0 1 26.492533 92.3308789
## 1919 0 1 26.492533 92.3308789
## 1920 0 1 26.492533 92.3308789
## 1921 0 1 26.492533 92.3308789
## 1922 0 1 26.492533 92.3308789
## 1923 0 1 26.492533 92.3308789
## 1924 0 1 26.492533 92.3308789
## 1925 0 1 26.492533 92.3308789
## 1926 0 1 26.492533 92.3308789
## 1927 0 1 26.492533 92.3308789
## 1928 0 1 26.492533 92.3308789
## 1929 0 1 26.492533 92.3308789
## 1930 0 1 26.492533 92.3308789
## 1931 0 1 26.492533 92.3308789
## 1932 0 1 26.492533 92.3308789
## 1933 0 1 26.492533 92.3308789
## 1934 0 1 26.492533 92.3308789
## 1935 0 1 26.492533 92.3308789
## 1936 0 1 26.492533 92.3308789
## 1937 0 1 26.492533 92.3308789
## 1938 0 1 26.492533 92.3308789
## 1939 0 1 26.492533 92.3308789
## 1940 0 1 26.492533 92.3308789
## 1941 0 1 26.492533 92.3308789
## 1942 0 1 26.492533 92.3308789
## 1943 0 1 26.492533 92.3308789
## 1944 0 1 26.492533 92.3308789
## 1945 0 1 26.492533 92.3308789
## 1946 0 1 26.492533 92.3308789
## 1947 0 1 26.492533 92.3308789
## 1948 0 1 26.492533 92.3308789
## 1949 0 1 26.492533 92.3308789
## 1950 0 1 26.492533 92.3308789
## 1951 0 1 26.492533 92.3308789
## 1952 0 1 26.492533 92.3308789
## 1953 0 1 26.492533 92.3308789
## 1954 0 1 26.492533 92.3308789
## 1955 0 1 26.492533 92.3308789
## 1956 0 1 26.492533 92.3308789
## 1957 0 1 26.492533 92.3308789
## 1958 0 1 26.492533 92.3308789
## 1959 0 1 26.492533 92.3308789
## 1960 0 1 26.492533 92.3308789
## 1961 0 1 26.492533 92.3308789
## 1962 0 1 26.492533 92.3308789
## 1963 0 1 26.492533 92.3308789
## 1964 0 1 26.492533 92.3308789
## 1965 0 1 26.492533 92.3308789
## 1966 0 1 26.492533 92.3308789
## 1967 0 1 26.492533 92.3308789
## 1968 0 1 26.492533 92.3308789
## 1969 0 1 26.492533 92.3308789
## 1970 0 1 26.492533 92.3308789
## 1971 0 1 26.492533 92.3308789
## 1972 0 1 26.492533 92.3308789
## 1973 0 1 26.492533 92.3308789
## 1974 0 1 26.492533 92.3308789
## 1975 0 1 26.492533 92.3308789
## 1976 0 1 26.492533 92.3308789
## 1977 0 1 26.492533 92.3308789
## 1978 0 1 26.492533 92.3308789
## 1979 0 1 26.492533 92.3308789
## 1980 0 1 26.492533 92.3308789
## 1981 0 1 26.492533 92.3308789
## 1982 0 1 26.492533 92.3308789
## 1983 0 1 26.492533 92.3308789
## 1984 0 1 26.492533 92.3308789
## 1985 0 1 26.492533 92.3308789
## 1986 0 1 26.492533 92.3308789
## 1987 0 1 26.492533 92.3308789
## 1988 0 1 26.492533 92.3308789
## 1989 0 1 26.492533 92.3308789
## 1990 0 1 26.492533 92.3308789
## 1991 0 1 26.492533 92.3308789
## 1992 0 1 26.492533 92.3308789
## 1993 0 1 26.492533 92.3308789
## 1994 0 1 26.492533 92.3308789
## 1995 0 1 26.492533 92.3308789
## 1996 0 1 26.492533 92.3308789
## 1997 0 1 26.492533 92.3308789
## 1998 0 1 26.492533 92.3308789
## 1999 0 1 26.492533 92.3308789
## 2000 0 1 26.492533 92.3308789
## 2001 0 1 26.492533 92.3308789
## 2002 0 1 26.492533 92.3308789
## 2003 0 1 26.492533 92.3308789
## 2004 0 1 26.492533 92.3308789
## 2005 0 1 26.492533 92.3308789
## 2006 0 1 26.492533 92.3308789
## 2007 0 1 26.492533 92.3308789
## 2008 0 1 26.492533 92.3308789
## 2009 0 1 26.492533 92.3308789
## 2010 0 1 26.492533 92.3308789
## 2011 0 1 26.492533 92.3308789
## 2012 0 1 26.492533 92.3308789
## 2013 0 1 26.492533 92.3308789
## 2014 0 1 26.492533 92.3308789
## 2015 0 1 26.492533 92.3308789
## 2016 0 1 26.492533 92.3308789
## 2017 0 1 26.492533 92.3308789
## 2018 0 1 26.492533 92.3308789
## 2019 0 1 26.492533 92.3308789
## 2020 0 1 26.492533 92.3308789
## 2021 0 1 26.492533 92.3308789
## 2022 0 1 26.492533 92.3308789
## 2023 0 1 26.492533 92.3308789
## 2024 0 1 26.492533 92.3308789
## 2025 0 1 26.492533 92.3308789
## 2026 0 1 26.492533 92.3308789
## 2027 0 1 26.492533 92.3308789
## 2028 0 1 26.492533 92.3308789
## 2029 0 1 26.492533 92.3308789
## 2030 0 1 26.492533 92.3308789
## 2031 0 1 26.492533 92.3308789
## 2032 0 1 26.492533 92.3308789
## 2033 0 1 26.492533 92.3308789
## 2034 0 1 26.492533 92.3308789
## 2035 0 1 26.492533 92.3308789
## 2036 0 1 26.492533 92.3308789
## 2037 0 1 26.492533 92.3308789
## 2038 0 1 26.492533 92.3308789
## 2039 0 1 26.492533 92.3308789
## 2040 0 1 26.492533 92.3308789
## 2041 0 1 26.492533 92.3308789
## 2042 0 1 26.492533 92.3308789
## 2043 0 1 26.492533 92.3308789
## 2044 0 1 26.492533 92.3308789
## 2045 0 1 26.492533 92.3308789
## 2046 0 1 26.492533 92.3308789
## 2047 0 1 26.492533 92.3308789
## 2048 0 1 26.492533 92.3308789
## 2049 0 1 26.492533 92.3308789
## 2050 0 1 26.492533 92.3308789
## 2051 0 1 26.492533 92.3308789
## 2052 0 1 26.492533 92.3308789
## 2053 0 1 26.492533 92.3308789
## 2054 0 1 26.492533 92.3308789
## 2055 0 1 26.492533 92.3308789
## 2056 0 1 26.492533 92.3308789
## 2057 0 1 26.492533 92.3308789
## 2058 0 1 26.492533 92.3308789
## 2059 0 1 26.492533 92.3308789
## 2060 0 1 26.492533 92.3308789
## 2061 0 1 26.492533 92.3308789
## 2062 0 1 26.492533 92.3308789
## 2063 0 1 26.492533 92.3308789
## 2064 0 1 26.492533 92.3308789
## lat_dest lon_dest distance_km duration_hr Price Comfortability
## 1 51.891073 -0.4230304 1755.41620 2.1942702 4 4
## 2 38.343637 -0.4881708 1853.06970 2.3163371 5 3
## 3 49.418616 2.0958657 809.67631 1.0120954 5 5
## 4 53.407199 -2.9916800 1861.41494 2.3267687 3 3
## 5 53.479489 -2.2451148 267.35412 0.3341927 5 4
## 6 54.348291 18.6540233 416.54244 0.5206780 1 2
## 7 43.471472 10.6797912 1217.95906 1.5224488 1 2
## 8 41.382580 2.1770730 894.42951 1.1180369 1 2
## 9 39.581252 2.7092683 1304.96565 1.6312071 1 1
## 10 41.328148 19.8184435 970.76442 1.2134555 5 3
## 11 41.382580 2.1770730 903.72225 1.1296528 1 1
## 12 51.886965 0.2441929 493.06224 0.6163278 1 1
## 13 51.197090 -0.6943123 1428.46211 1.7855776 2 1
## 14 53.349379 -6.2605593 326.50928 0.4081366 5 4
## 15 32.649650 -16.9086783 972.32414 1.2154052 5 4
## 16 37.016294 -7.9351820 1929.05933 2.4113242 5 3
## 17 40.835885 14.2487679 534.33603 0.6679200 3 4
## 18 45.464194 9.1896346 1029.41502 1.2867688 1 1
## 19 56.949398 24.1051846 845.87361 1.0573420 5 4
## 20 34.774399 32.4231586 370.19802 0.4627475 2 2
## 21 38.266032 20.5373903 1218.66435 1.5233304 1 3
## 22 39.591337 19.8596189 2195.89818 2.7448727 1 2
## 23 55.686724 12.5700724 871.85834 1.0898229 1 1
## 24 46.159732 -1.1515951 599.41433 0.7492679 4 3
## 25 59.611099 16.5463679 1330.74116 1.6634265 1 1
## 26 43.213036 2.3491069 815.97805 1.0199726 5 3
## 27 37.016294 -7.9351820 1863.13444 2.3289180 3 1
## 28 33.959768 -83.3763980 7022.05827 8.7775728 1 1
## 29 51.886965 0.2441929 1635.97697 2.0449712 1 1
## 30 32.751750 -16.9817487 969.03906 1.2112988 5 2
## 31 38.343637 -0.4881708 1402.59056 1.7532382 1 1
## 32 35.769630 -5.8033522 547.67910 0.6845989 1 1
## 33 51.453802 -2.5972985 1002.02384 1.2525298 1 1
## 34 51.886965 0.2441929 538.00570 0.6725071 1 2
## 35 51.891073 -0.4230304 609.96240 0.7624530 1 1
## 36 38.707751 -9.1365919 470.48274 0.5881034 1 1
## 37 48.151699 17.1093063 1025.88457 1.2823557 3 2
## 38 37.016294 -7.9351820 998.05742 1.2475718 1 1
## 39 54.687046 25.2829111 8069.37892 10.0867236 1 1
## 40 41.893320 12.4829321 1903.70884 2.3796361 4 1
## 41 35.512083 24.0191544 2287.75348 2.8596919 4 4
## 42 53.349379 -6.2605593 1885.08820 2.3563603 4 5
## 43 47.497879 19.0402383 810.58091 1.0132261 1 1
## 44 44.841225 -0.5800364 746.54133 0.9331767 1 2
## 45 52.517389 13.3951309 2894.78401 3.6184800 1 2
## 46 41.382580 2.1770730 1123.95863 1.4049483 2 2
## 47 52.517389 13.3951309 988.54243 1.2356780 4 1
## 48 45.835424 1.2644847 677.10537 0.8463817 1 2
## 49 52.517389 13.3951309 1319.84914 1.6498114 2 1
## 50 51.389344 -0.0559576 6980.34468 8.7254308 3 2
## 51 43.471472 10.6797912 878.25481 1.0978185 1 2
## 52 45.437191 12.3345898 791.17661 0.9889708 4 3
## 53 33.959768 -83.3763980 9286.52715 11.6081589 3 1
## 54 54.597580 -5.9277097 809.17099 1.0114637 5 3
## 55 55.953346 -3.1883749 351.13059 0.4389132 1 2
## 56 45.756656 9.7542192 771.32326 0.9641541 1 1
## 57 41.893320 12.4829321 1758.11561 2.1976445 4 3
## 58 36.407111 25.4566637 9286.52715 11.6081589 1 1
## 59 38.707751 -9.1365919 1594.37118 1.9929640 1 1
## 60 51.514227 7.4652789 824.36046 1.0304506 1 3
## 61 50.411623 4.4445280 3218.44265 4.0230533 5 3
## 62 55.953346 -3.1883749 1585.47065 1.9818383 1 2
## 63 55.953346 -3.1883749 351.13059 0.4389132 4 3
## 64 31.630795 -7.9883600 1048.23874 1.3102984 1 1
## 65 51.507446 -0.1277653 1586.55039 1.9831880 1 1
## 66 51.544096 -0.0040005 533.68115 0.6671014 1 1
## 67 51.886965 0.2441929 505.52671 0.6319084 1 2
## 68 50.846557 4.3516970 844.49118 1.0556140 1 2
## 69 45.437191 12.3345898 1321.44754 1.6518094 1 1
## 70 54.597580 -5.9277097 510.36553 0.6379569 3 3
## 71 51.886965 0.2441929 1635.97697 2.0449712 1 1
## 72 53.479489 -2.2451148 1704.95782 2.1311973 1 3
## 73 50.938361 6.9599740 788.03843 0.9850480 5 3
## 74 51.886965 0.2441929 1141.01745 1.4262718 5 3
## 75 50.413441 -5.0848836 368.83704 0.4610463 1 1
## 76 51.544096 -0.0040005 1410.89357 1.7636170 1 1
## 77 33.959768 -83.3763980 8017.96681 10.0224585 1 1
## 78 51.453802 -2.5972985 326.50928 0.4081366 3 1
## 79 53.349379 -6.2605593 326.50928 0.4081366 5 2
## 80 37.992379 -1.1305431 1751.88027 2.1898503 1 1
## 81 53.349379 -6.2605593 1725.65466 2.1570683 5 2
## 82 54.973847 -1.6131572 1611.40630 2.0142579 1 1
## 83 41.893320 12.4829321 2380.34965 2.9754371 2 1
## 84 52.233374 21.0711489 7985.94897 9.9824362 1 1
## 85 41.382580 2.1770730 275.06692 0.3438337 1 1
## 86 28.293578 -16.6214471 3590.94464 4.4886808 1 2
## 87 38.707751 -9.1365919 1320.29247 1.6503656 5 2
## 88 43.296174 5.3699525 1328.45541 1.6605693 5 2
## 89 51.544096 -0.0040005 518.12506 0.6476563 5 5
## 90 51.514227 7.4652789 518.12506 0.6476563 5 5
## 91 53.349379 -6.2605593 1242.75739 1.5534467 3 2
## 92 33.959768 -83.3763980 6713.72206 8.3921526 1 1
## 93 44.772084 17.1917651 387.11619 0.4838952 5 2
## 94 54.687046 25.2829111 1235.47016 1.5443377 5 4
## 95 51.886965 0.2441929 970.26762 1.2128345 1 2
## 96 51.886965 0.2441929 1773.35202 2.2166900 5 5
## 97 45.437191 12.3345898 1141.01745 1.4262718 1 1
## 98 51.886965 0.2441929 1141.01745 1.4262718 1 3
## 99 38.707751 -9.1365919 969.03906 1.2112988 1 2
## 100 53.349379 -6.2605593 1603.93039 2.0049130 3 3
## 101 45.607370 9.5418715 818.13405 1.0226676 4 1
## 102 51.886965 0.2441929 1106.08780 1.3826098 1 2
## 103 40.835885 14.2487679 534.33603 0.6679200 1 1
## 104 55.686724 12.5700724 871.85834 1.0898229 1 1
## 105 37.502361 15.0873718 1709.31701 2.1366463 1 1
## 106 53.479489 -2.2451148 1563.78844 1.9547355 1 2
## 107 36.721303 -4.4216366 1976.73101 2.4709138 5 3
## 108 50.938361 6.9599740 670.04142 0.8375518 1 3
## 109 36.721303 -4.4216366 2633.74551 3.2921819 1 1
## 110 53.349379 -6.2605593 308.65595 0.3858199 1 1
## 111 43.471472 10.6797912 1217.95906 1.5224488 1 2
## 112 32.751750 -16.9817487 969.03906 1.2112988 5 4
## 113 41.382580 2.1770730 1944.27226 2.4303403 1 1
## 114 41.893320 12.4829321 1888.71734 2.3608967 2 2
## 115 53.349379 -6.2605593 3162.64606 3.9533076 5 1
## 116 47.497879 19.0402383 1436.40256 1.7955032 5 4
## 117 53.349379 -6.2605593 1773.97944 2.2174743 2 1
## 118 34.774399 32.4231586 370.19802 0.4627475 5 3
## 119 53.349379 -6.2605593 2009.97850 2.5124731 1 3
## 120 55.953346 -3.1883749 1636.31702 2.0453963 5 3
## 121 28.400377 -14.0048697 3179.68654 3.9746082 5 4
## 122 37.016294 -7.9351820 1773.35202 2.2166900 1 1
## 123 37.034399 27.4306510 3162.64606 3.9533076 5 3
## 124 50.846557 4.3516970 932.54677 1.1656835 1 2
## 125 37.016294 -7.9351820 1650.71763 2.0633970 5 3
## 126 52.517389 13.3951309 2851.09768 3.5638721 1 1
## 127 53.349379 -6.2605593 464.57804 0.5807226 1 1
## 128 50.857985 5.6969882 67.93408 0.0849176 1 1
## 129 33.959768 -83.3763980 9286.52715 11.6081589 1 1
## 130 32.649650 -16.9086783 972.32414 1.2154052 1 1
## 131 27.958000 -15.6062305 2922.60832 3.6532604 3 4
## 132 51.448557 5.4501225 1032.09372 1.2901171 1 1
## 133 51.886965 0.2441929 1506.20708 1.8827589 5 5
## 134 51.528489 -0.1281638 1824.62856 2.2807857 1 5
## 135 56.949398 24.1051846 1103.33611 1.3791701 1 1
## 136 51.108978 17.0326689 1194.70079 1.4933760 1 2
## 137 28.293578 -16.6214471 2826.35378 3.5329422 5 3
## 138 53.349379 -6.2605593 308.65595 0.3858199 5 3
## 139 59.325117 18.0710935 1887.56198 2.3594525 2 1
## 140 45.607370 9.5418715 1717.79796 2.1472474 2 2
## 141 36.721303 -4.4216366 1917.41837 2.3967730 2 1
## 142 37.016294 -7.9351820 527.07233 0.6588404 1 1
## 143 38.707751 -9.1365919 969.03906 1.2112988 4 1
## 144 50.061947 19.9368564 1591.22168 1.9890271 1 2
## 145 51.886965 0.2441929 2864.80950 3.5810119 3 1
## 146 28.400377 -14.0048697 2864.80950 3.5810119 3 1
## 147 49.453872 11.0772980 456.51086 0.5706386 1 3
## 148 52.233374 21.0711489 1870.11474 2.3376434 1 1
## 149 35.762568 -5.8295062 165.32175 0.2066522 4 3
## 150 53.349379 -6.2605593 3162.64606 3.9533076 5 2
## 151 33.959768 -83.3763980 9286.52715 11.6081589 1 3
## 152 53.797418 -1.5437941 1741.07204 2.1763401 4 1
## 153 51.886965 0.2441929 1106.08780 1.3826098 1 1
## 154 37.016294 -7.9351820 1328.45541 1.6605693 5 2
## 155 55.953346 -3.1883749 351.13059 0.4389132 1 1
## 156 36.721303 -4.4216366 1886.50586 2.3581323 2 2
## 157 33.959768 -83.3763980 8143.25989 10.1790749 1 1
## 158 45.444261 9.2755075 1523.94247 1.9049281 1 1
## 159 55.953346 -3.1883749 1967.52211 2.4594026 1 1
## 160 36.767214 28.8002737 3269.18427 4.0864803 5 1
## 161 38.343637 -0.4881708 2681.07494 3.3513437 1 2
## 162 40.422677 -3.7100732 1449.88160 1.8123520 1 1
## 163 52.233374 21.0711489 573.04796 0.7163099 1 1
## 164 47.497879 19.0402383 1899.97852 2.3749732 1 1
## 165 50.857985 5.6969882 396.47151 0.4955894 3 3
## 166 51.886965 0.2441929 469.44046 0.5868006 1 1
## 167 53.407199 -2.9916800 577.60142 0.7220018 4 3
## 168 37.388630 -5.9953403 1486.52498 1.8581562 1 2
## 169 59.325117 18.0710935 1312.23238 1.6402905 1 3
## 170 38.707751 -9.1365919 983.93884 1.2299236 1 1
## 171 53.349379 -6.2605593 351.13059 0.4389132 1 2
## 172 45.464194 9.1896346 1214.28642 1.5178580 3 3
## 173 44.853457 0.4875310 984.27190 1.2303399 3 2
## 174 48.853495 2.3483915 1213.99210 1.5174901 1 1
## 175 53.349379 -6.2605593 758.19438 0.9477430 1 2
## 176 51.544096 -0.0040005 1817.02750 2.2712844 1 1
## 177 9.869479 -83.7980749 8519.38510 10.6492314 2 1
## 178 51.886965 0.2441929 1840.91019 2.3011377 5 3
## 179 52.517389 13.3951309 846.64494 1.0583062 1 1
## 180 53.349379 -6.2605593 758.19438 0.9477430 5 3
## 181 59.325117 18.0710935 2682.74700 3.3534337 1 1
## 182 53.479489 -2.2451148 1590.24409 1.9878051 1 1
## 183 43.946543 12.6307490 1276.08128 1.5951016 3 3
## 184 41.382580 2.1770730 1271.64330 1.5895541 3 5
## 185 37.016294 -7.9351820 715.25960 0.8940745 1 1
## 186 51.891073 -0.4230304 2946.73976 3.6834247 5 1
## 187 52.056811 4.5386252 341.38610 0.4267326 5 3
## 188 53.349379 -6.2605593 3080.78843 3.8509855 1 1
## 189 53.349379 -6.2605593 1471.73969 1.8396746 1 3
## 190 51.891073 -0.4230304 2133.10907 2.6663863 1 1
## 191 49.815868 6.1296751 1728.38754 2.1604844 1 1
## 192 59.646792 17.9370443 2234.65995 2.7933249 1 1
## 193 59.646792 17.9370443 2234.65995 2.7933249 1 1
## 194 39.949257 4.0499642 662.15019 0.8276877 5 3
## 195 42.424920 18.7713332 1748.96195 2.1862024 1 1
## 196 55.953346 -3.1883749 2425.06487 3.0313311 1 1
## 197 32.649650 -16.9086783 1197.45992 1.4968249 1 1
## 198 48.208354 16.3725042 711.41690 0.8892711 1 1
## 199 47.497879 19.0402383 2169.73932 2.7121741 1 3
## 200 59.325117 18.0710935 728.11873 0.9101484 1 1
## 201 37.016294 -7.9351820 1934.22002 2.4177750 3 2
## 202 53.349379 -6.2605593 1320.69518 1.6508690 5 3
## 203 53.797418 -1.5437941 1741.07204 2.1763401 2 3
## 204 44.436141 26.1027202 1666.95203 2.0836900 1 1
## 205 51.886965 0.2441929 1016.29719 1.2703715 1 2
## 206 43.296174 5.3699525 1022.04389 1.2775549 1 1
## 207 53.349379 -6.2605593 1472.80072 1.8410009 1 1
## 208 50.846557 4.3516970 3329.34564 4.1616820 5 1
## 209 27.958000 -15.6062305 3046.41555 3.8080194 5 4
## 210 51.886965 0.2441929 2135.41343 2.6692668 2 2
## 211 52.517389 13.3951309 2851.09768 3.5638721 1 1
## 212 47.497879 19.0402383 1131.66060 1.4145757 1 1
## 213 41.893320 12.4829321 1690.88215 2.1136027 1 1
## 214 35.888599 14.4476911 2599.36925 3.2492116 1 1
## 215 48.853495 2.3483915 1189.71097 1.4871387 1 1
## 216 44.841225 -0.5800364 854.95081 1.0686885 5 4
## 217 55.953346 -3.1883749 1143.58905 1.4294863 1 1
## 218 37.016294 -7.9351820 2279.62928 2.8495366 4 3
## 219 53.479489 -2.2451148 689.18200 0.8614775 2 3
## 220 35.888599 14.4476911 1832.20142 2.2902518 1 2
## 221 47.497879 19.0402383 1453.28670 1.8166084 2 2
## 222 62.473262 16.1894654 1471.29322 1.8391165 2 1
## 223 51.507446 -0.1277653 1344.15973 1.6801997 3 1
## 224 45.813097 15.9772795 1082.36627 1.3529578 1 1
## 225 52.479699 -1.9026911 1781.99727 2.2274966 5 4
## 226 39.613432 2.8829185 1611.88167 2.0148521 2 2
## 227 38.964507 16.3021451 1899.79747 2.3747468 4 3
## 228 51.898514 -8.4726423 456.17394 0.5702174 2 2
## 229 51.886965 0.2441929 2135.41343 2.6692668 1 1
## 230 54.973847 -1.6131572 2053.14773 2.5664347 3 2
## 231 51.891073 -0.4230304 2842.72983 3.5534123 1 1
## 232 44.841225 -0.5800364 1646.01278 2.0575160 3 3
## 233 38.111227 13.3524434 636.46464 0.7955808 1 1
## 234 54.973847 -1.6131572 2040.01428 2.5500179 1 2
## 235 45.756656 9.7542192 1890.72447 2.3634056 3 1
## 236 59.913330 10.7389701 1155.52647 1.4444081 1 1
## 237 50.463637 4.4661733 654.61200 0.8182650 1 1
## 238 51.886965 0.2441929 1773.35202 2.2166900 1 1
## 239 37.149805 -91.4328245 7649.56076 9.5619510 4 4
## 240 53.349379 -6.2605593 2909.56694 3.6369587 2 1
## 241 51.886965 0.2441929 970.26762 1.2128345 1 2
## 242 52.502539 -3.2573033 128.21594 0.1602699 4 3
## 243 55.953346 -3.1883749 1697.42232 2.1217779 1 1
## 244 50.059629 14.4464593 1354.04447 1.6925556 1 1
## 245 36.721303 -4.4216366 1683.74566 2.1046821 1 1
## 246 41.893320 12.4829321 1366.43860 1.7080482 1 2
## 247 45.607370 9.5418715 2637.76179 3.2972022 1 1
## 248 52.479699 -1.9026911 1277.18451 1.5964806 5 1
## 249 32.085300 34.7818064 3246.89987 4.0586248 5 3
## 250 51.886965 0.2441929 1388.56282 1.7357035 1 2
## 251 37.502361 15.0873718 1491.29379 1.8641172 1 2
## 252 40.416782 -3.7035070 1450.59751 1.8132469 1 1
## 253 47.218637 -1.5541362 696.25354 0.8703169 1 2
## 254 32.085300 34.7818064 2851.09768 3.5638721 1 2
## 255 43.604464 1.4442433 925.24290 1.1565536 1 2
## 256 53.349379 -6.2605593 1642.25416 2.0528177 1 1
## 257 45.464194 9.1896346 1094.87467 1.3685933 4 3
## 258 28.963968 -13.5499014 3032.65454 3.7908182 5 3
## 259 34.774399 32.4231586 370.19802 0.4627475 1 1
## 260 48.853495 2.3483915 1863.60711 2.3295089 1 2
## 261 39.591337 19.8596189 1169.14625 1.4614328 5 5
## 262 35.898998 14.5136607 1630.68355 2.0383544 5 3
## 263 47.497879 19.0402383 810.58091 1.0132261 1 1
## 264 45.756656 9.7542192 612.16615 0.7652077 1 3
## 265 51.544096 -0.0040005 1151.27458 1.4390932 5 1
## 266 47.497879 19.0402383 1642.43968 2.0530496 3 1
## 267 33.959768 -83.3763980 9244.03567 11.5550446 1 1
## 268 41.800289 12.6004706 1460.70881 1.8258860 1 1
## 269 39.581252 2.7092683 265.58218 0.3319777 5 2
## 270 41.382580 2.1770730 1093.20796 1.3665099 2 3
## 271 53.794799 -8.9193547 500.87450 0.6260931 1 2
## 272 51.886965 0.2441929 1506.20708 1.8827589 5 3
## 273 52.517389 13.3951309 933.84245 1.1673031 1 1
## 274 51.886965 0.2441929 974.42797 1.2180350 1 1
## 275 51.538824 0.7128137 1988.32238 2.4854030 1 1
## 276 49.418616 2.0958657 893.14428 1.1164304 1 2
## 277 40.416782 -3.7035070 1263.10362 1.5788795 5 5
## 278 45.464194 9.1896346 1029.41502 1.2867688 1 1
## 279 50.061947 19.9368564 755.61547 0.9445193 5 5
## 280 37.149805 -91.4328245 6974.53420 8.7181677 1 1
## 281 44.351141 2.5728493 820.74020 1.0259252 1 1
## 282 41.800289 12.6004706 1446.26099 1.8078262 1 2
## 283 32.085300 34.7818064 2367.65181 2.9595648 1 2
## 284 33.959768 -83.3763980 7336.79463 9.1709933 1 3
## 285 48.208354 16.3725042 2403.25857 3.0040732 2 2
## 286 53.349379 -6.2605593 6245.79598 7.8072450 2 1
## 287 45.464194 9.1896346 1171.18682 1.4639835 1 2
## 288 51.886965 0.2441929 1436.40256 1.7955032 2 1
## 289 35.308495 24.4633423 2660.75990 3.3259499 2 1
## 290 48.208354 16.3725042 744.72496 0.9309062 3 2
## 291 38.974390 1.4197463 275.06692 0.3438337 1 1
## 292 45.437191 12.3345898 930.46324 1.1630790 4 3
## 293 41.893320 12.4829321 810.58091 1.0132261 3 1
## 294 39.569582 2.6500745 695.56843 0.8694605 4 4
## 295 50.846557 4.3516970 8795.91533 10.9948942 1 2
## 296 44.493820 11.3426327 661.69695 0.8271212 1 2
## 297 53.349379 -6.2605593 758.19438 0.9477430 5 2
## 298 43.471472 10.6797912 969.97642 1.2124705 5 3
## 299 48.208354 16.3725042 917.14267 1.1464283 1 1
## 300 33.959768 -83.3763980 9286.52715 11.6081589 1 1
## 301 41.893320 12.4829321 810.58091 1.0132261 5 3
## 302 53.407199 -2.9916800 1685.26688 2.1065836 1 1
## 303 44.493820 11.3426327 1162.33878 1.4529235 5 5
## 304 42.441524 19.2621081 1774.97222 2.2187153 1 2
## 305 28.293578 -16.6214471 2946.73976 3.6834247 1 2
## 306 36.721303 -4.4216366 1724.90065 2.1561258 1 2
## 307 50.059629 14.4464593 1016.29719 1.2703715 1 2
## 308 51.507446 -0.1277653 1463.17087 1.8289636 1 2
## 309 50.110644 8.6820917 1093.20796 1.3665099 1 5
## 310 38.343637 -0.4881708 1643.27398 2.0540925 1 1
## 311 52.373080 4.8924534 758.19438 0.9477430 1 1
## 312 56.949398 24.1051846 1666.22414 2.0827802 1 2
## 313 49.815868 6.1296751 535.57482 0.6694685 1 2
## 314 40.640317 22.9352716 2135.41343 2.6692668 5 5
## 315 50.846557 4.3516970 1718.09986 2.1476248 5 5
## 316 50.061947 19.9368564 1410.89357 1.7636170 1 2
## 317 43.107032 12.4029962 1323.02612 1.6537827 2 3
## 318 50.046943 19.9971534 1447.94289 1.8099286 3 3
## 319 36.721303 -4.4216366 1762.23765 2.2027971 1 2
## 320 51.886965 0.2441929 3186.44742 3.9830593 1 2
## 321 28.293578 -16.6214471 3253.73235 4.0671654 5 4
## 322 52.233374 21.0711489 1836.66869 2.2958359 1 1
## 323 48.758438 6.8985177 826.98487 1.0337311 1 2
## 324 51.891073 -0.4230304 427.19484 0.5339936 1 2
## 325 40.835885 14.2487679 1872.37635 2.3404704 2 2
## 326 37.992379 -1.1305431 1611.18485 2.0139811 1 2
## 327 53.479489 -2.2451148 1642.43968 2.0530496 2 2
## 328 48.208354 16.3725042 2303.62373 2.8795297 1 2
## 329 43.094090 -0.0464975 906.90810 1.1336351 5 4
## 330 45.464194 9.1896346 2132.07831 2.6650979 1 2
## 331 50.846557 4.3516970 777.80804 0.9722601 1 1
## 332 39.581252 2.7092683 1186.47975 1.4830997 1 3
## 333 41.150219 -8.6103497 1358.07685 1.6975961 5 3
## 334 51.886965 0.2441929 2785.82349 3.4822794 1 2
## 335 41.382580 2.1770730 1472.80072 1.8410009 1 2
## 336 40.635860 17.6884975 1827.73820 2.2846727 4 3
## 337 36.767214 28.8002737 3269.18427 4.0864803 5 5
## 338 53.794799 -8.9193547 609.96240 0.7624530 5 4
## 339 37.739340 -25.6689503 1449.66846 1.8120856 5 3
## 340 41.893320 12.4829321 1690.88215 2.1136027 1 2
## 341 52.056811 4.5386252 341.38610 0.4267326 1 2
## 342 50.059629 14.4464593 1016.29719 1.2703715 1 2
## 343 29.039708 -13.6362916 2653.27646 3.3165956 1 2
## 344 52.233374 21.0711489 1167.53841 1.4594230 1 2
## 345 41.652134 -0.8809428 1097.04488 1.3713061 2 2
## 346 50.846557 4.3516970 135.27444 0.1690930 1 2
## 347 51.507446 -0.1277653 958.74862 1.1984358 1 2
## 348 48.208354 16.3725042 857.76673 1.0722084 1 2
## 349 51.507446 -0.1277653 464.57804 0.5807226 1 1
## 350 41.800289 12.6004706 812.92819 1.0161602 3 3
## 351 36.721303 -4.4216366 1557.61692 1.9470211 1 2
## 352 51.886965 0.2441929 363.38098 0.4542262 2 2
## 353 51.197090 -0.6943123 2254.85466 2.8185683 2 2
## 354 36.721303 -4.4216366 1557.61692 1.9470211 5 2
## 355 53.349379 -6.2605593 1959.76578 2.4497072 3 2
## 356 51.389344 -0.0559576 6980.34468 8.7254308 3 3
## 357 50.938361 6.9599740 646.91259 0.8086407 1 2
## 358 54.898214 23.9044817 1643.71134 2.0546392 2 2
## 359 53.075820 8.8071646 596.21639 0.7452705 1 2
## 360 50.059629 14.4464593 1210.08036 1.5126004 5 5
## 361 52.517389 13.3951309 904.91764 1.1311470 1 2
## 362 41.150219 -8.6103497 1570.74740 1.9634342 2 1
## 363 51.886965 0.2441929 2135.41343 2.6692668 1 1
## 364 52.233374 21.0711489 1447.88139 1.8098517 1 1
## 365 53.349379 -6.2605593 1242.75739 1.5534467 1 1
## 366 51.507446 -0.1277653 1039.91984 1.2998998 5 4
## 367 50.846557 4.3516970 652.01084 0.8150136 1 1
## 368 55.953346 -3.1883749 1674.87868 2.0935983 1 1
## 369 51.448557 5.4501225 1202.87868 1.5035983 1 1
## 370 36.721303 -4.4216366 1716.46595 2.1455824 5 5
## 371 52.502539 -3.2573033 1128.10470 1.4101309 1 2
## 372 45.806691 12.2063158 745.99774 0.9324972 5 3
## 373 53.349379 -6.2605593 1902.92155 2.3786519 5 4
## 374 53.349379 -6.2605593 448.93454 0.5611682 1 1
## 375 51.886965 0.2441929 1436.40256 1.7955032 1 2
## 376 38.707751 -9.1365919 2475.35099 3.0941887 1 1
## 377 37.388630 -5.9953403 1683.90103 2.1048763 1 1
## 378 50.938361 6.9599740 788.03843 0.9850480 2 1
## 379 51.507446 -0.1277653 1677.77137 2.0972142 5 1
## 380 28.400377 -14.0048697 2864.80950 3.5810119 4 3
## 381 51.453802 -2.5972985 1515.31594 1.8941449 5 3
## 382 59.325117 18.0710935 1312.23238 1.6402905 5 4
## 383 33.959768 -83.3763980 7068.51826 8.8356478 1 1
## 384 53.479489 -2.2451148 997.17297 1.2464662 4 1
## 385 41.150219 -8.6103497 903.72225 1.1296528 1 1
## 386 55.686724 12.5700724 1242.75739 1.5534467 1 3
## 387 51.544096 -0.0040005 1467.46548 1.8343318 1 3
## 388 41.125784 16.8620293 1732.36496 2.1654562 5 3
## 389 37.502361 15.0873718 187.98342 0.2349793 1 1
## 390 53.349379 -6.2605593 448.93454 0.5611682 5 4
## 391 51.254630 4.7270745 1697.28638 2.1216080 2 1
## 392 52.517389 13.3951309 2394.43487 2.9930436 1 4
## 393 53.797418 -1.5437941 1719.61671 2.1495209 1 1
## 394 53.479489 -2.2451148 3034.81877 3.7935235 1 1
## 395 56.949398 24.1051846 1656.97533 2.0712192 1 1
## 396 36.721303 -4.4216366 2139.80772 2.6747597 5 4
## 397 28.293578 -16.6214471 2972.09945 3.7151243 4 2
## 398 37.388630 -5.9953403 831.51368 1.0393921 5 5
## 399 54.997868 -7.3213056 333.34203 0.4166775 1 1
## 400 53.349379 -6.2605593 1450.59751 1.8132469 1 1
## 401 36.721303 -4.4216366 470.48274 0.5881034 1 3
## 402 53.349379 -6.2605593 1427.52723 1.7844090 1 2
## 403 55.953346 -3.1883749 1347.84430 1.6848054 5 4
## 404 48.208354 16.3725042 1036.77470 1.2959684 1 1
## 405 38.707751 -9.1365919 2958.49081 3.6981135 1 1
## 406 51.544096 -0.0040005 470.22714 0.5877839 1 1
## 407 41.382580 2.1770730 1500.33111 1.8754139 3 1
## 408 51.544096 -0.0040005 1269.16351 1.5864544 1 1
## 409 51.453802 -2.5972985 1343.03141 1.6787893 1 1
## 410 38.974390 1.4197463 1421.44921 1.7768115 2 1
## 411 38.707751 -9.1365919 1816.18160 2.2702270 1 2
## 412 50.061947 19.9368564 1591.22168 1.9890271 3 3
## 413 53.349379 -6.2605593 427.19484 0.5339936 1 1
## 414 50.110644 8.6820917 1093.20796 1.3665099 2 2
## 415 40.416782 -3.7035070 467.61389 0.5845174 1 1
## 416 52.517389 13.3951309 1296.59433 1.6207429 1 1
## 417 48.853495 2.3483915 846.42385 1.0580298 1 1
## 418 45.437191 12.3345898 1380.01119 1.7250140 4 3
## 419 53.349379 -6.2605593 777.80804 0.9722601 1 3
## 420 55.686724 12.5700724 914.11278 1.1426410 1 2
## 421 51.886965 0.2441929 1310.41113 1.6380139 1 2
## 422 41.382580 2.1770730 1176.93267 1.4711658 1 1
## 423 50.846557 4.3516970 1718.09986 2.1476248 1 1
## 424 47.497879 19.0402383 1436.40256 1.7955032 1 2
## 425 41.893320 12.4829321 1866.53200 2.3331650 1 2
## 426 50.061947 19.9368564 1737.50076 2.1718760 3 1
## 427 36.721303 -4.4216366 1821.48933 2.2768617 4 5
## 428 51.886965 0.2441929 1827.73820 2.2846727 5 3
## 429 55.686724 12.5700724 914.11278 1.1426410 1 2
## 430 47.218637 -1.5541362 978.31978 1.2228997 3 3
## 431 28.334772 -10.3713379 1084.05114 1.3550639 1 1
## 432 51.886965 0.2441929 1141.01745 1.4262718 1 2
## 433 50.846557 4.3516970 2442.53529 3.0531691 1 1
## 434 36.407111 25.4566637 9286.52715 11.6081589 1 1
## 435 52.517389 13.3951309 1320.69518 1.6508690 1 1
## 436 41.125784 16.8620293 1734.00341 2.1675043 3 2
## 437 36.721303 -4.4216366 1853.43200 2.3167900 5 3
## 438 41.893320 12.4829321 860.02254 1.0750282 1 1
## 439 41.382580 2.1770730 1271.64330 1.5895541 1 1
## 440 53.349379 -6.2605593 758.19438 0.9477430 1 1
## 441 41.382580 2.1770730 1141.77306 1.4272163 1 2
## 442 45.464194 9.1896346 1686.51074 2.1081384 2 2
## 443 51.891073 -0.4230304 205.37718 0.2567215 1 3
## 444 51.886965 0.2441929 1162.33878 1.4529235 2 1
## 445 53.349379 -6.2605593 1461.40395 1.8267549 1 1
## 446 44.841225 -0.5800364 746.54133 0.9331767 1 1
## 447 41.800289 12.6004706 1704.95782 2.1311973 1 1
## 448 31.625826 -7.9891608 664.93046 0.8311631 1 1
## 449 45.464194 9.1896346 960.86996 1.2010874 1 1
## 450 41.382580 2.1770730 2199.49989 2.7493749 1 1
## 451 54.687046 25.2829111 1728.93084 2.1611635 2 2
## 452 33.959768 -83.3763980 6713.72206 8.3921526 1 1
## 453 53.349379 -6.2605593 1381.10018 1.7263752 5 5
## 454 53.349379 -6.2605593 1738.26354 2.1728294 5 4
## 455 50.846557 4.3516970 834.53051 1.0431631 1 3
## 456 39.469707 -0.3763353 762.31806 0.9528976 1 2
## 457 41.382580 2.1770730 936.97509 1.1712189 1 1
## 458 59.437242 24.7572802 1742.53565 2.1781696 5 3
## 459 39.569582 2.6500745 1288.77018 1.6109627 1 1
## 460 48.208354 16.3725042 765.51926 0.9568991 1 2
## 461 34.774399 32.4231586 370.19802 0.4627475 1 2
## 462 51.886965 0.2441929 1106.08780 1.3826098 1 2
## 463 53.407199 -2.9916800 394.66586 0.4933323 1 4
## 464 27.958000 -15.6062305 3629.82716 4.5372839 1 2
## 465 45.649648 13.7772781 1209.70223 1.5121278 2 2
## 466 53.349379 -6.2605593 1853.43200 2.3167900 3 3
## 467 35.512083 24.0191544 2778.69088 3.4733636 4 2
## 468 51.886965 0.2441929 2619.86291 3.2748286 1 1
## 469 51.886965 0.2441929 1436.40256 1.7955032 1 2
## 470 53.349379 -6.2605593 823.62548 1.0295319 3 2
## 471 53.479489 -2.2451148 267.35412 0.3341927 1 1
## 472 38.343637 -0.4881708 1968.02921 2.4600365 5 3
## 473 55.498280 -4.6113017 1850.98451 2.3137306 1 2
## 474 53.479489 -2.2451148 1384.98849 1.7312356 3 2
## 475 48.853495 2.3483915 1755.05187 2.1938148 2 1
## 476 53.349379 -6.2605593 758.19438 0.9477430 1 1
## 477 48.151699 17.1093063 1111.36792 1.3892099 5 4
## 478 45.808488 9.5768675 1012.52331 1.2656541 1 1
## 479 44.493820 11.3426327 661.69695 0.8271212 1 1
## 480 53.407199 -2.9916800 2842.42210 3.5530276 1 3
## 481 41.382580 2.1770730 1139.17181 1.4239648 3 2
## 482 39.469707 -0.3763353 542.16480 0.6777060 1 1
## 483 55.953346 -3.1883749 1143.58905 1.4294863 1 1
## 484 39.613432 2.8829185 1589.70925 1.9871366 1 1
## 485 55.861155 -4.2501687 1923.97920 2.4049740 1 1
## 486 45.756656 9.7542192 422.91463 0.5286433 1 3
## 487 40.416782 -3.7035070 422.05629 0.5275704 1 1
## 488 41.382580 2.1770730 1354.04447 1.6925556 1 2
## 489 41.893320 12.4829321 860.02254 1.0750282 2 1
## 490 54.597580 -5.9277097 271.42497 0.3392812 1 2
## 491 42.310262 13.9575901 1477.44537 1.8468067 1 1
## 492 31.625826 -7.9891608 2471.07013 3.0888377 1 1
## 493 40.640317 22.9352716 2135.41343 2.6692668 1 1
## 494 41.150219 -8.6103497 422.05629 0.5275704 1 2
## 495 41.382580 2.1770730 1141.77306 1.4272163 1 2
## 496 50.450034 30.5241361 2399.66282 2.9995785 1 1
## 497 50.100869 8.6748912 1117.38054 1.3967257 1 2
## 498 55.861155 -4.2501687 308.27640 0.3853455 1 3
## 499 51.197090 -0.6943123 448.93454 0.5611682 1 1
## 500 40.416782 -3.7035070 662.15019 0.8276877 1 2
## 501 51.544096 -0.0040005 1134.59254 1.4182407 3 2
## 502 37.149805 -91.4328245 6949.74753 8.6871844 1 1
## 503 52.479699 -1.9026911 2950.60993 3.6882624 3 1
## 504 39.469707 -0.3763353 1444.03138 1.8050392 1 3
## 505 52.517389 13.3951309 652.01084 0.8150136 1 2
## 506 51.886965 0.2441929 1025.12306 1.2814038 1 1
## 507 43.511638 16.4399659 1991.12719 2.4889090 2 4
## 508 36.721303 -4.4216366 1643.03894 2.0537987 5 5
## 509 40.416782 -3.7035070 1870.71503 2.3383938 1 1
## 510 45.464194 9.1896346 698.03150 0.8725394 1 1
## 511 37.388630 -5.9953403 1659.26819 2.0740852 2 2
## 512 38.707751 -9.1365919 1866.53200 2.3331650 1 1
## 513 44.436141 26.1027202 1172.98466 1.4662308 1 1
## 514 51.886965 0.2441929 1016.29719 1.2703715 5 2
## 515 56.949398 24.1051846 1709.60008 2.1370001 5 4
## 516 45.464194 9.1896346 1418.39417 1.7729927 1 1
## 517 38.343637 -0.4881708 1469.39649 1.8367456 5 5
## 518 39.469707 -0.3763353 1380.49364 1.7256171 1 1
## 519 41.893320 12.4829321 375.34415 0.4691802 2 1
## 520 41.382580 2.1770730 275.06692 0.3438337 1 4
## 521 52.517389 13.3951309 1500.03969 1.8750496 2 1
## 522 45.756656 9.7542192 1428.55768 1.7856971 5 4
## 523 55.953346 -3.1883749 351.13059 0.4389132 1 1
## 524 45.437191 12.3345898 1139.76192 1.4247024 1 1
## 525 53.349379 -6.2605593 1091.01226 1.3637653 2 2
## 526 56.949398 24.1051846 1709.60008 2.1370001 5 4
## 527 53.797418 -1.5437941 1663.02289 2.0787786 1 1
## 528 39.569582 2.6500745 1871.82370 2.3397796 1 1
## 529 47.497879 19.0402383 810.58091 1.0132261 1 2
## 530 53.349379 -6.2605593 2155.46511 2.6943314 2 2
## 531 39.581252 2.7092683 1654.71991 2.0683999 1 1
## 532 53.349379 -6.2605593 1078.23470 1.3477934 4 2
## 533 41.382580 2.1770730 1176.93267 1.4711658 1 1
## 534 52.373080 4.8924534 758.19438 0.9477430 1 1
## 535 39.217199 9.1133110 693.94470 0.8674309 4 2
## 536 53.349379 -6.2605593 758.19438 0.9477430 1 1
## 537 41.382580 2.1770730 860.02254 1.0750282 1 1
## 538 36.721303 -4.4216366 7441.78466 9.3022308 1 2
## 539 39.569582 2.6500745 205.27784 0.2565973 1 3
## 540 53.479489 -2.2451148 6747.10415 8.4338802 1 2
## 541 53.479489 -2.2451148 1384.98849 1.7312356 1 1
## 542 45.756656 9.7542192 1292.90730 1.6161341 1 2
## 543 55.686724 12.5700724 1522.55373 1.9031922 2 2
## 544 36.407111 25.4566637 9286.52715 11.6081589 1 1
## 545 31.625826 -7.9891608 2472.93032 3.0911629 1 2
## 546 51.886965 0.2441929 3186.44742 3.9830593 2 1
## 547 51.886965 0.2441929 914.11278 1.1426410 1 1
## 548 52.517389 13.3951309 1320.69518 1.6508690 3 2
## 549 37.016294 -7.9351820 1929.05933 2.4113242 1 1
## 550 41.893320 12.4829321 1446.62255 1.8082782 1 2
## 551 38.974390 1.4197463 1663.02289 2.0787786 1 1
## 552 33.959768 -83.3763980 9286.52715 11.6081589 1 2
## 553 50.059629 14.4464593 441.60745 0.5520093 1 2
## 554 55.953346 -3.1883749 1871.08084 2.3388511 2 1
## 555 48.853495 2.3483915 1106.61720 1.3832715 1 1
## 556 37.707614 -81.2506570 458.02003 0.5725250 1 1
## 557 41.150219 -8.6103497 1371.04987 1.7138123 4 4
## 558 53.794799 -8.9193547 652.39137 0.8154892 1 2
## 559 51.481655 -3.1791934 1194.88941 1.4936118 1 3
## 560 51.886965 0.2441929 1217.95906 1.5224488 1 2
## 561 54.973847 -1.6131572 1850.61958 2.3132745 1 1
## 562 45.437191 12.3345898 1287.87678 1.6098460 4 2
## 563 53.407199 -2.9916800 1391.72247 1.7396531 1 1
## 564 34.774399 32.4231586 3186.44742 3.9830593 4 3
## 565 58.785027 16.9217222 774.72534 0.9684067 5 3
## 566 53.407199 -2.9916800 1685.26688 2.1065836 3 2
## 567 55.953346 -3.1883749 1666.54835 2.0831854 1 1
## 568 55.953346 -3.1883749 1789.11999 2.2364000 2 1
## 569 48.758438 6.8985177 826.98487 1.0337311 3 3
## 570 51.428603 -0.0131715 1719.55691 2.1494461 1 1
## 571 54.597580 -5.9277097 271.42497 0.3392812 2 3
## 572 50.720151 -1.8799118 1597.16830 1.9964604 1 1
## 573 35.888599 14.4476911 2189.03962 2.7362995 2 1
## 574 38.343637 -0.4881708 1853.06970 2.3163371 1 1
## 575 43.461893 -3.8100255 544.01295 0.6800162 2 2
## 576 36.721303 -4.4216366 1683.74566 2.1046821 1 2
## 577 33.959768 -83.3763980 6702.57648 8.3782206 1 1
## 578 51.886965 0.2441929 1635.97697 2.0449712 2 3
## 579 53.479489 -2.2451148 2507.61524 3.1345191 1 1
## 580 52.502539 -3.2573033 205.37718 0.2567215 3 3
## 581 34.021845 -6.8408929 2064.75116 2.5809389 1 2
## 582 53.550341 10.0006540 1078.23470 1.3477934 1 2
## 583 52.502539 -3.2573033 209.53331 0.2619166 3 3
## 584 41.893320 12.4829321 810.58091 1.0132261 4 3
## 585 40.416782 -3.7035070 762.24654 0.9528082 1 1
## 586 51.453802 -2.5972985 1658.82276 2.0735284 5 3
## 587 54.687046 25.2829111 1685.89504 2.1073688 1 2
## 588 48.208354 16.3725042 1271.97212 1.5899651 2 1
## 589 51.891073 -0.4230304 6669.91908 8.3373989 2 3
## 590 49.192244 16.6113382 1195.51891 1.4943986 3 3
## 591 56.149628 10.2134046 806.27760 1.0078470 5 3
## 592 51.453802 -2.5972985 500.87450 0.6260931 5 4
## 593 50.059629 14.4464593 441.60745 0.5520093 3 2
## 594 41.382580 2.1770730 1271.64330 1.5895541 1 3
## 595 51.886965 0.2441929 648.90597 0.8111325 5 5
## 596 37.149805 -91.4328245 6974.53420 8.7181677 1 1
## 597 41.893320 12.4829321 860.02254 1.0750282 1 1
## 598 53.349379 -6.2605593 310.05713 0.3875714 2 1
## 599 51.886965 0.2441929 2967.67627 3.7095953 1 1
## 600 53.479489 -2.2451148 774.74576 0.9684322 2 5
## 601 28.963968 -13.5499014 2790.74800 3.4884350 1 3
## 602 51.886965 0.2441929 1484.32871 1.8554109 2 1
## 603 35.512083 24.0191544 2778.69088 3.4733636 1 1
## 604 53.349379 -6.2605593 351.13059 0.4389132 1 1
## 605 41.893320 12.4829321 860.02254 1.0750282 1 1
## 606 53.118818 -1.2597069 334.83969 0.4185496 2 1
## 607 37.016294 -7.9351820 1755.41620 2.1942702 1 1
## 608 53.349379 -6.2605593 267.35412 0.3341927 5 4
## 609 53.479489 -2.2451148 267.35412 0.3341927 5 4
## 610 53.349379 -6.2605593 2544.16092 3.1802011 2 4
## 611 41.382580 2.1770730 903.72225 1.1296528 2 2
## 612 39.569582 2.6500745 1590.24409 1.9878051 1 1
## 613 50.059629 14.4464593 441.60745 0.5520093 1 3
## 614 45.835424 1.2644847 886.86698 1.1085837 1 1
## 615 50.110644 8.6820917 1091.01226 1.3637653 1 2
## 616 27.958000 -15.6062305 2779.93976 3.4749247 1 1
## 617 49.815868 6.1296751 925.76288 1.1572036 1 2
## 618 51.886965 0.2441929 1446.62255 1.8082782 1 1
## 619 41.382580 2.1770730 1014.96791 1.2687099 1 1
## 620 40.835885 14.2487679 1014.96791 1.2687099 1 2
## 621 33.959768 -83.3763980 9286.52715 11.6081589 1 1
## 622 53.479489 -2.2451148 1456.33139 1.8204142 5 4
## 623 47.497879 19.0402383 689.08689 0.8613586 1 2
## 624 53.349379 -6.2605593 475.33916 0.5941739 4 3
## 625 53.349379 -6.2605593 758.19438 0.9477430 2 2
## 626 53.349379 -6.2605593 1659.55031 2.0744379 3 2
## 627 51.886965 0.2441929 1371.04987 1.7138123 1 1
## 628 51.886965 0.2441929 2108.53983 2.6356748 2 1
## 629 51.544096 -0.0040005 1346.67417 1.6833427 3 3
## 630 53.407199 -2.9916800 1257.27861 1.5715983 5 4
## 631 51.448557 5.4501225 1920.79082 2.4009885 5 3
## 632 37.502361 15.0873718 8460.88992 10.5761124 5 4
## 633 51.886965 0.2441929 782.31412 0.9778927 5 5
## 634 50.059629 14.4464593 1354.04447 1.6925556 1 2
## 635 36.407111 25.4566637 9286.52715 11.6081589 1 1
## 636 51.891073 -0.4230304 1545.56074 1.9319509 1 1
## 637 41.382580 2.1770730 1472.80072 1.8410009 3 2
## 638 48.758438 6.8985177 587.55798 0.7344475 1 2
## 639 53.349379 -6.2605593 448.93454 0.5611682 2 2
## 640 41.382580 2.1770730 1384.98849 1.7312356 1 2
## 641 52.517389 13.3951309 2315.64617 2.8945577 5 3
## 642 51.886965 0.2441929 914.11278 1.1426410 4 3
## 643 44.436141 26.1027202 2080.17164 2.6002145 1 1
## 644 41.382580 2.1770730 903.72225 1.1296528 1 2
## 645 32.085300 34.7818064 2637.76179 3.2972022 1 1
## 646 51.886965 0.2441929 1222.40517 1.5280065 3 3
## 647 53.349379 -6.2605593 475.33916 0.5941739 2 2
## 648 53.479489 -2.2451148 1724.25185 2.1553148 1 1
## 649 41.382580 2.1770730 1065.17197 1.3314650 1 1
## 650 51.538824 0.7128137 1742.67121 2.1783390 4 3
## 651 52.517389 13.3951309 2241.16956 2.8014620 1 1
## 652 41.979301 2.8199439 1128.91505 1.4111438 5 3
## 653 36.721303 -4.4216366 2139.80772 2.6747597 1 2
## 654 41.382580 2.1770730 1065.17197 1.3314650 5 4
## 655 40.416782 -3.7035070 1190.40488 1.4880061 5 3
## 656 34.021845 -6.8408929 2064.75116 2.5809389 2 1
## 657 33.959768 -83.3763980 6669.91908 8.3373989 1 1
## 658 51.886965 0.2441929 1773.35202 2.2166900 5 4
## 659 29.039708 -13.6362916 2785.82349 3.4822794 1 1
## 660 51.448557 5.4501225 1189.43399 1.4867925 5 4
## 661 51.544096 -0.0040005 1134.59254 1.4182407 1 1
## 662 33.959768 -83.3763980 7515.95826 9.3949478 1 1
## 663 53.479489 -2.2451148 271.42497 0.3392812 2 1
## 664 41.382580 2.1770730 1666.54835 2.0831854 1 1
## 665 44.436141 26.1027202 2080.17164 2.6002145 1 2
## 666 36.721303 -4.4216366 1917.41837 2.3967730 1 1
## 667 51.886965 0.2441929 2104.07263 2.6300908 1 1
## 668 38.343637 -0.4881708 1428.46211 1.7855776 1 1
## 669 47.497879 19.0402383 689.08689 0.8613586 5 2
## 670 51.538824 0.7128137 1988.32238 2.4854030 2 3
## 671 41.382580 2.1770730 1330.05869 1.6625734 1 2
## 672 38.707751 -9.1365919 1586.55039 1.9831880 2 1
## 673 40.416782 -3.7035070 2478.91820 3.0986477 1 1
## 674 33.959768 -83.3763980 7515.95826 9.3949478 1 1
## 675 40.635860 17.6884975 862.10764 1.0776345 5 4
## 676 35.888599 14.4476911 2523.69778 3.1546222 1 1
## 677 28.293578 -16.6214471 2826.35378 3.5329422 1 2
## 678 48.778449 9.1800132 802.57996 1.0032250 4 2
## 679 53.349379 -6.2605593 475.33916 0.5941739 1 1
## 680 41.893320 12.4829321 1074.89894 1.3436237 1 1
## 681 52.479699 -1.9026911 1574.89497 1.9686187 1 2
## 682 40.835885 14.2487679 1628.49600 2.0356200 1 1
## 683 41.382580 2.1770730 823.46293 1.0293287 3 2
## 684 27.139073 -82.3960152 6995.01301 8.7437663 2 2
## 685 53.349379 -6.2605593 1634.88810 2.0436101 1 2
## 686 33.959768 -83.3763980 9286.52715 11.6081589 1 1
## 687 51.197090 -0.6943123 448.93454 0.5611682 1 1
## 688 33.959768 -83.3763980 9286.52715 11.6081589 1 2
## 689 33.959768 -83.3763980 6674.07154 8.3425894 1 1
## 690 51.507446 -0.1277653 1039.91984 1.2998998 1 1
## 691 53.349379 -6.2605593 448.93454 0.5611682 3 1
## 692 50.463637 4.4661733 2288.69466 2.8608683 2 1
## 693 36.721303 -4.4216366 1853.43200 2.3167900 2 1
## 694 41.893320 12.4829321 1446.62255 1.8082782 2 2
## 695 39.581252 2.7092683 1186.47975 1.4830997 2 2
## 696 41.382580 2.1770730 1384.98849 1.7312356 1 1
## 697 41.150219 -8.6103497 903.72225 1.1296528 1 1
## 698 51.453802 -2.5972985 1382.20393 1.7277549 2 1
## 699 45.464194 9.1896346 920.07131 1.1500891 5 3
## 700 53.349379 -6.2605593 217.61658 0.2720207 1 1
## 701 53.479489 -2.2451148 1456.33139 1.8204142 5 3
## 702 40.416782 -3.7035070 1456.33139 1.8204142 1 1
## 703 51.886965 0.2441929 469.44046 0.5868006 1 1
## 704 41.150219 -8.6103497 903.72225 1.1296528 1 2
## 705 55.953346 -3.1883749 1347.84430 1.6848054 3 1
## 706 41.800289 12.6004706 1704.95782 2.1311973 1 1
## 707 59.325117 18.0710935 2989.65498 3.7370687 1 1
## 708 53.349379 -6.2605593 334.83969 0.4185496 5 4
## 709 51.886965 0.2441929 478.81986 0.5985248 1 2
## 710 45.464194 9.1896346 842.23678 1.0527960 1 1
## 711 53.349379 -6.2605593 334.83969 0.4185496 5 5
## 712 52.479699 -1.9026911 1781.99727 2.2274966 4 2
## 713 53.550341 10.0006540 901.23525 1.1265441 1 1
## 714 51.886965 0.2441929 2104.07263 2.6300908 1 1
## 715 56.949398 24.1051846 846.64494 1.0583062 1 3
## 716 51.886965 0.2441929 2080.17164 2.6002145 1 2
## 717 39.591337 19.8596189 2075.35771 2.5941971 2 1
## 718 28.293578 -16.6214471 3171.40565 3.9642571 4 4
## 719 51.886965 0.2441929 1162.33878 1.4529235 5 4
## 720 40.416782 -3.7035070 1775.21936 2.2190242 1 2
## 721 51.891073 -0.4230304 553.84468 0.6923058 5 5
## 722 49.815868 6.1296751 474.04535 0.5925567 4 1
## 723 45.756656 9.7542192 1292.90730 1.6161341 5 5
## 724 51.453802 -2.5972985 2826.35378 3.5329422 1 2
## 725 52.479699 -1.9026911 1271.64330 1.5895541 2 1
## 726 50.846557 4.3516970 1440.72456 1.8009057 1 1
## 727 40.416782 -3.7035070 1456.33139 1.8204142 1 3
## 728 37.016294 -7.9351820 1819.81764 2.2747721 4 4
## 729 48.208354 16.3725042 1222.40517 1.5280065 5 4
## 730 53.479489 -2.2451148 1570.65134 1.9633142 1 4
## 731 29.039708 -13.6362916 2785.82349 3.4822794 5 5
## 732 34.774399 32.4231586 451.79309 0.5647414 5 5
## 733 31.625826 -7.9891608 2491.62216 3.1145277 5 4
## 734 54.597580 -5.9277097 1802.88737 2.2536092 1 1
## 735 61.497793 23.7616372 1295.20139 1.6190017 5 2
## 736 29.939130 34.9384889 2817.98579 3.5224822 3 4
## 737 41.382580 2.1770730 205.05203 0.2563150 5 4
## 738 39.581252 2.7092683 205.05203 0.2563150 4 4
## 739 45.464194 9.1896346 886.64495 1.1083062 1 2
## 740 34.021845 -6.8408929 2064.75116 2.5809389 1 2
## 741 52.517389 13.3951309 7515.95826 9.3949478 1 3
## 742 50.059629 14.4464593 892.09147 1.1151143 1 3
## 743 40.640317 22.9352716 8828.67153 11.0358394 5 2
## 744 55.686724 12.5700724 914.11278 1.1426410 1 1
## 745 50.110644 8.6820917 1893.70209 2.3671276 1 1
## 746 29.039708 -13.6362916 2869.00404 3.5862551 1 2
## 747 51.886965 0.2441929 505.52671 0.6319084 5 3
## 748 40.416782 -3.7035070 1456.33139 1.8204142 1 1
## 749 40.416782 -3.7035070 555.29080 0.6941135 5 3
## 750 39.581252 2.7092683 205.05203 0.2563150 4 3
## 751 51.886965 0.2441929 1724.90065 2.1561258 1 1
## 752 41.382580 2.1770730 275.06692 0.3438337 1 1
## 753 28.293578 -16.6214471 3171.40565 3.9642571 2 2
## 754 58.785027 16.9217222 1340.36229 1.6754529 5 3
## 755 37.388630 -5.9953403 831.51368 1.0393921 1 3
## 756 41.382580 2.1770730 1354.04447 1.6925556 1 1
## 757 44.493820 11.3426327 1042.44806 1.3030601 1 1
## 758 51.886965 0.2441929 785.82939 0.9822867 1 1
## 759 40.635860 17.6884975 457.93460 0.5724183 1 1
## 760 50.061947 19.9368564 804.72880 1.0059110 1 2
## 761 35.888599 14.4476911 2133.10907 2.6663863 1 1
## 762 31.625826 -7.9891608 2334.07651 2.9175956 1 1
## 763 51.886965 0.2441929 1310.41113 1.6380139 2 2
## 764 51.886965 0.2441929 1141.34295 1.4266787 1 1
## 765 45.067755 7.6824892 920.16308 1.1502038 1 1
## 766 44.493820 11.3426327 1248.03144 1.5600393 2 1
## 767 37.149805 -91.4328245 6974.53420 8.7181677 3 3
## 768 40.640317 22.9352716 8828.67153 11.0358394 1 1
## 769 34.774399 32.4231586 1201.30035 1.5016254 1 2
## 770 40.416782 -3.7035070 1790.62132 2.2382767 1 1
## 771 45.464194 9.1896346 1653.19707 2.0664963 1 1
## 772 55.953346 -3.1883749 351.13059 0.4389132 3 2
## 773 38.707751 -9.1365919 1635.97697 2.0449712 3 1
## 774 50.061947 19.9368564 1528.23222 1.9102903 1 2
## 775 53.349379 -6.2605593 1472.80072 1.8410009 3 1
## 776 37.016294 -7.9351820 1969.13313 2.4614164 2 2
## 777 54.597580 -5.9277097 510.36553 0.6379569 1 2
## 778 35.888599 14.4476911 2133.10907 2.6663863 4 3
## 779 47.497879 19.0402383 555.64648 0.6945581 1 3
## 780 53.349379 -6.2605593 334.83969 0.4185496 3 1
## 781 53.349379 -6.2605593 427.19484 0.5339936 5 5
## 782 37.502361 15.0873718 837.67313 1.0470914 1 1
## 783 50.110644 8.6820917 623.99744 0.7799968 2 2
## 784 47.497879 19.0402383 1268.50111 1.5856264 4 2
## 785 52.233374 21.0711489 687.34241 0.8591780 1 1
## 786 55.498280 -4.6113017 2087.16990 2.6089624 1 1
## 787 41.150219 -8.6103497 903.72225 1.1296528 1 2
## 788 41.893320 12.4829321 1090.64753 1.3633094 1 2
## 789 33.959768 -83.3763980 8017.96681 10.0224585 1 2
## 790 50.061947 19.9368564 1836.52710 2.2956589 5 3
## 791 51.886965 0.2441929 1217.95906 1.5224488 2 3
## 792 51.507446 -0.1277653 1618.95684 2.0236960 1 1
## 793 44.436141 26.1027202 1276.23771 1.5952971 1 2
## 794 51.453802 -2.5972985 1658.82276 2.0735284 5 3
## 795 51.453802 -2.5972985 670.04142 0.8375518 1 1
## 796 50.110644 8.6820917 7336.79463 9.1709933 4 5
## 797 53.794799 -8.9193547 609.96240 0.7624530 3 3
## 798 38.707751 -9.1365919 1893.70209 2.3671276 5 3
## 799 31.625826 -7.9891608 1048.78175 1.3109772 1 1
## 800 38.707751 -9.1365919 1893.70209 2.3671276 5 4
## 801 53.349379 -6.2605593 1242.75739 1.5534467 4 2
## 802 41.357956 2.0807828 1150.86770 1.4385846 1 1
## 803 41.150219 -8.6103497 1371.04987 1.7138123 1 1
## 804 33.959768 -83.3763980 9286.52715 11.6081589 1 1
## 805 49.453872 11.0772980 627.26521 0.7840815 1 1
## 806 50.938361 6.9599740 1123.95863 1.4049483 1 1
## 807 50.061947 19.9368564 1547.54265 1.9344283 3 1
## 808 51.886965 0.2441929 1346.29634 1.6828704 2 1
## 809 36.721303 -4.4216366 1886.50586 2.3581323 1 1
## 810 36.407111 25.4566637 9286.52715 11.6081589 1 1
## 811 50.846557 4.3516970 721.67304 0.9020913 1 1
## 812 44.493820 11.3426327 1615.63300 2.0195412 5 4
## 813 40.640317 22.9352716 8828.67153 11.0358394 5 1
## 814 53.349379 -6.2605593 1888.71734 2.3608967 3 1
## 815 51.197090 -0.6943123 448.93454 0.5611682 1 2
## 816 41.382580 2.1770730 860.02254 1.0750282 5 3
## 817 51.886965 0.2441929 469.44046 0.5868006 3 1
## 818 41.893320 12.4829321 1106.61720 1.3832715 1 2
## 819 51.225402 6.7763137 1961.72890 2.4521611 5 3
## 820 51.886965 0.2441929 1683.90103 2.1048763 1 2
## 821 40.416782 -3.7035070 2258.96172 2.8237022 3 1
## 822 31.302979 30.1208130 9978.61630 12.4732704 1 1
## 823 51.886965 0.2441929 2036.93129 2.5461641 3 1
## 824 34.774399 32.4231586 1059.03297 1.3237912 1 2
## 825 53.349379 -6.2605593 1853.43200 2.3167900 2 1
## 826 51.448557 5.4501225 363.38098 0.4542262 1 1
## 827 37.739340 -25.6689503 1449.66846 1.8120856 2 2
## 828 52.233374 21.0711489 1507.48617 1.8843577 4 2
## 829 39.591337 19.8596189 1461.96060 1.8274507 1 1
## 830 37.149805 -91.4328245 6974.53420 8.7181677 5 4
## 831 53.118818 -1.2597069 1568.48345 1.9606043 2 1
## 832 52.517389 13.3951309 7515.95826 9.3949478 1 1
## 833 36.721303 -4.4216366 770.31137 0.9628892 1 1
## 834 41.893320 12.4829321 1446.62255 1.8082782 1 1
## 835 40.635860 17.6884975 1827.73820 2.2846727 1 1
## 836 42.697703 23.3217359 1171.18682 1.4639835 2 3
## 837 41.382580 2.1770730 901.38840 1.1267355 1 2
## 838 41.979301 2.8199439 1314.84240 1.6435530 4 3
## 839 38.266032 20.5373903 2186.96791 2.7337099 2 1
## 840 39.591337 19.8596189 2036.93129 2.5461641 1 1
## 841 53.407199 -2.9916800 1639.21273 2.0490159 1 1
## 842 51.886965 0.2441929 500.74312 0.6259289 5 4
## 843 47.497879 19.0402383 823.10687 1.0288836 5 4
## 844 39.581252 2.7092683 1570.36573 1.9629572 5 2
## 845 41.893320 12.4829321 8017.96681 10.0224585 3 4
## 846 41.382580 2.1770730 1870.11474 2.3376434 1 1
## 847 59.913330 10.7389701 1106.08780 1.3826098 1 1
## 848 50.938361 6.9599740 670.04142 0.8375518 1 1
## 849 51.886965 0.2441929 1628.49600 2.0356200 1 1
## 850 52.365928 13.4886435 478.74068 0.5984259 3 2
## 851 33.959768 -83.3763980 6713.72206 8.3921526 1 1
## 852 55.861155 -4.2501687 1206.57883 1.5082235 4 4
## 853 51.544096 -0.0040005 1445.58248 1.8069781 1 1
## 854 51.544096 -0.0040005 1283.89432 1.6048679 5 3
## 855 43.604464 1.4442433 925.24290 1.1565536 1 1
## 856 36.950734 14.6074553 578.37989 0.7229749 1 1
## 857 51.886965 0.2441929 2080.17164 2.6002145 1 1
## 858 50.038581 15.7791356 1108.34561 1.3854320 1 2
## 859 45.607370 9.5418715 975.86240 1.2198280 2 2
## 860 48.151699 17.1093063 7982.00327 9.9775041 1 1
## 861 41.893320 12.4829321 1141.55059 1.4269382 1 1
## 862 51.886965 0.2441929 1446.62255 1.8082782 1 1
## 863 52.517389 13.3951309 477.86934 0.5973367 1 1
## 864 50.938361 6.9599740 478.81986 0.5985248 1 1
## 865 51.886965 0.2441929 925.24290 1.1565536 1 1
## 866 53.407199 -2.9916800 1639.21273 2.0490159 1 1
## 867 43.471472 10.6797912 1663.82699 2.0797837 5 4
## 868 51.886965 0.2441929 2135.41343 2.6692668 2 3
## 869 33.959768 -83.3763980 8017.96681 10.0224585 1 2
## 870 51.886965 0.2441929 3186.44742 3.9830593 3 2
## 871 41.382580 2.1770730 205.27784 0.2565973 1 1
## 872 43.471472 10.6797912 1217.95906 1.5224488 1 1
## 873 37.016294 -7.9351820 1773.35202 2.2166900 2 1
## 874 45.464194 9.1896346 960.86996 1.2010874 2 3
## 875 55.686724 12.5700724 646.77645 0.8084706 1 1
## 876 51.886965 0.2441929 3186.44742 3.9830593 1 1
## 877 51.886965 0.2441929 1217.95906 1.5224488 1 1
## 878 51.886965 0.2441929 1162.33878 1.4529235 1 2
## 879 50.110644 8.6820917 587.14827 0.7339353 1 1
## 880 51.886965 0.2441929 6713.72206 8.3921526 3 1
## 881 40.835885 14.2487679 1655.90618 2.0698827 1 1
## 882 51.886965 0.2441929 1217.95906 1.5224488 1 1
## 883 51.886965 0.2441929 1381.57207 1.7269651 1 1
## 884 51.886965 0.2441929 2135.41343 2.6692668 1 1
## 885 55.953346 -3.1883749 888.74491 1.1109311 1 1
## 886 53.349379 -6.2605593 1472.80072 1.8410009 2 1
## 887 51.886965 0.2441929 1460.70881 1.8258860 3 1
## 888 44.493820 11.3426327 586.09486 0.7326186 1 1
## 889 51.886965 0.2441929 1840.91019 2.3011377 1 1
## 890 41.893320 12.4829321 1173.94622 1.4674328 4 4
## 891 44.436141 26.1027202 1079.47176 1.3493397 1 2
## 892 41.893320 12.4829321 8017.96681 10.0224585 1 1
## 893 47.497879 19.0402383 1899.97852 2.3749732 1 2
## 894 51.886965 0.2441929 2135.41343 2.6692668 3 1
## 895 41.382580 2.1770730 1139.17181 1.4239648 1 1
## 896 51.507446 -0.1277653 1890.70917 2.3633865 2 1
## 897 50.110644 8.6820917 623.99744 0.7799968 1 1
## 898 50.059629 14.4464593 1347.84430 1.6848054 2 2
## 899 27.958000 -15.6062305 3033.78977 3.7922372 1 4
## 900 37.427467 -122.1702445 8690.71734 10.8633967 1 4
## 901 51.898514 -8.4726423 599.72748 0.7496594 1 2
## 902 49.453872 11.0772980 811.31397 1.0141425 5 4
## 903 45.437191 12.3345898 936.97509 1.1712189 1 3
## 904 54.973847 -1.6131572 1850.61958 2.3132745 2 2
## 905 37.388630 -5.9953403 1832.20142 2.2902518 1 1
## 906 51.886965 0.2441929 505.52671 0.6319084 1 1
## 907 52.517389 13.3951309 1500.03969 1.8750496 1 1
## 908 53.479489 -2.2451148 689.18200 0.8614775 5 5
## 909 50.938361 6.9599740 689.18200 0.8614775 5 5
## 910 41.382580 2.1770730 936.97509 1.1712189 1 2
## 911 39.581252 2.7092683 1654.21811 2.0677726 5 3
## 912 38.343637 -0.4881708 1565.96341 1.9574543 1 2
## 913 43.604464 1.4442433 1040.15855 1.3001982 1 3
## 914 48.853495 2.3483915 1106.61720 1.3832715 3 2
## 915 31.625826 -7.9891608 2191.06687 2.7388336 5 2
## 916 41.893320 12.4829321 1173.94622 1.4674328 1 2
## 917 53.349379 -6.2605593 1674.67744 2.0933468 1 1
## 918 40.640317 22.9352716 1506.28153 1.8828519 1 1
## 919 40.835885 14.2487679 1872.37635 2.3404704 5 3
## 920 41.382580 2.1770730 757.85244 0.9473156 2 1
## 921 29.039708 -13.6362916 2766.31610 3.4578951 5 4
## 922 52.517389 13.3951309 1206.57883 1.5082235 1 1
## 923 41.150219 -8.6103497 1498.37154 1.8729644 2 2
## 924 51.544096 -0.0040005 1141.77306 1.4272163 2 1
## 925 51.886965 0.2441929 1106.08780 1.3826098 1 1
## 926 42.697703 23.3217359 2258.96172 2.8237022 1 2
## 927 51.886965 0.2441929 1380.90815 1.7261352 1 2
## 928 51.886965 0.2441929 1141.01745 1.4262718 1 1
## 929 53.118818 -1.2597069 1643.27398 2.0540925 4 4
## 930 43.471472 10.6797912 664.45716 0.8305715 1 1
## 931 53.407199 -2.9916800 1596.87380 1.9960922 1 2
## 932 53.349379 -6.2605593 448.93454 0.5611682 4 1
## 933 51.453802 -2.5972985 500.87450 0.6260931 1 1
## 934 48.151699 17.1093063 1447.06304 1.8088288 1 1
## 935 51.886965 0.2441929 1162.33878 1.4529235 1 1
## 936 51.886965 0.2441929 6974.53420 8.7181677 1 1
## 937 51.886965 0.2441929 900.58056 1.1257257 1 2
## 938 51.886965 0.2441929 505.52671 0.6319084 1 1
## 939 53.349379 -6.2605593 1381.10018 1.7263752 3 2
## 940 50.938361 6.9599740 1821.83889 2.2772986 2 1
## 941 53.349379 -6.2605593 1450.59751 1.8132469 1 1
## 942 50.110644 8.6820917 623.99744 0.7799968 1 1
## 943 50.411623 4.4445280 1114.86970 1.3935871 1 1
## 944 50.846557 4.3516970 777.80804 0.9722601 1 2
## 945 33.959768 -83.3763980 9211.04557 11.5138070 1 2
## 946 53.349379 -6.2605593 777.80804 0.9722601 2 3
## 947 39.469707 -0.3763353 1029.41502 1.2867688 2 3
## 948 39.569582 2.6500745 1590.24409 1.9878051 2 1
## 949 41.150219 -8.6103497 1513.70408 1.8921301 4 3
## 950 37.739340 -25.6689503 1513.70408 1.8921301 5 3
## 951 35.888599 14.4476911 2197.75126 2.7471891 5 4
## 952 51.886965 0.2441929 970.26762 1.2128345 3 1
## 953 51.886965 0.2441929 2009.70067 2.5121258 1 1
## 954 53.349379 -6.2605593 6245.79598 7.8072450 1 2
## 955 55.686724 12.5700724 1014.40113 1.2680014 2 2
## 956 53.349379 -6.2605593 469.44046 0.5868006 4 3
## 957 33.959768 -83.3763980 6713.72206 8.3921526 5 5
## 958 39.591337 19.8596189 2268.22351 2.8352794 1 1
## 959 37.016294 -7.9351820 1658.82276 2.0735284 5 3
## 960 51.453802 -2.5972985 1658.82276 2.0735284 5 4
## 961 37.739340 -25.6689503 1449.66846 1.8120856 1 2
## 962 43.232858 0.0781021 1040.26607 1.3003326 4 4
## 963 41.382580 2.1770730 888.51769 1.1106471 5 1
## 964 45.464194 9.1896346 726.23539 0.9077942 4 2
## 965 51.886965 0.2441929 1543.52954 1.9294119 1 1
## 966 51.886965 0.2441929 2104.07263 2.6300908 1 1
## 967 51.544096 -0.0040005 355.66761 0.4445845 5 4
## 968 49.453872 11.0772980 1026.30132 1.2828767 2 2
## 969 51.886965 0.2441929 1408.85820 1.7610727 1 1
## 970 33.959768 -83.3763980 8017.96681 10.0224585 1 1
## 971 53.075820 8.8071646 1066.46074 1.3330759 5 4
## 972 50.110644 8.6820917 908.90542 1.1361318 1 1
## 973 32.085300 34.7818064 2254.17397 2.8177175 1 1
## 974 51.507446 -0.1277653 1677.77137 2.0972142 2 3
## 975 40.640317 22.9352716 8828.67153 11.0358394 5 2
## 976 50.846557 4.3516970 757.13159 0.9464145 1 1
## 977 51.886965 0.2441929 925.24290 1.1565536 1 2
## 978 46.159732 -1.1515951 604.65017 0.7558127 1 1
## 979 44.493820 11.3426327 601.80987 0.7522623 5 2
## 980 53.479489 -2.2451148 1214.28642 1.5178580 1 2
## 981 51.886965 0.2441929 6713.72206 8.3921526 2 2
## 982 41.382580 2.1770730 860.02254 1.0750282 1 1
## 983 51.886965 0.2441929 1310.41113 1.6380139 1 2
## 984 38.707751 -9.1365919 1594.37118 1.9929640 1 1
## 985 41.800289 12.6004706 1902.92155 2.3786519 5 4
## 986 36.721303 -4.4216366 1762.23765 2.2027971 3 2
## 987 51.544096 -0.0040005 632.01079 0.7900135 1 1
## 988 49.006870 8.4034195 661.92645 0.8274081 2 3
## 989 41.382580 2.1770730 1384.98849 1.7312356 3 3
## 990 27.958000 -15.6062305 2922.60832 3.6532604 5 4
## 991 28.400377 -14.0048697 2842.61030 3.5532629 3 2
## 992 55.861155 -4.2501687 308.27640 0.3853455 4 3
## 993 38.343637 -0.4881708 1719.61671 2.1495209 5 3
## 994 50.110644 8.6820917 1076.02907 1.3450363 5 3
## 995 51.544096 -0.0040005 1779.80437 2.2247555 1 1
## 996 52.517389 13.3951309 1870.71503 2.3383938 3 3
## 997 53.349379 -6.2605593 475.33916 0.5941739 5 5
## 998 45.187560 5.7357819 824.32307 1.0304038 2 3
## 999 53.349379 -6.2605593 1899.97852 2.3749732 4 5
## 1000 51.898514 -8.4726423 586.20821 0.7327603 4 2
## 1001 53.349379 -6.2605593 942.38579 1.1779822 4 3
## 1002 41.893320 12.4829321 886.25963 1.1078245 1 1
## 1003 47.497879 19.0402383 1642.43968 2.0530496 2 1
## 1004 51.453802 -2.5972985 2827.37502 3.5342188 1 2
## 1005 50.110644 8.6820917 7336.79463 9.1709933 5 4
## 1006 33.959768 -83.3763980 7336.79463 9.1709933 5 4
## 1007 38.111227 13.3524434 426.44970 0.5330621 3 1
## 1008 32.085300 34.7818064 2254.17397 2.8177175 2 4
## 1009 38.707751 -9.1365919 1724.25185 2.1553148 5 3
## 1010 53.349379 -6.2605593 6245.79598 7.8072450 2 1
## 1011 31.625826 -7.9891608 1048.78175 1.3109772 2 1
## 1012 51.544096 -0.0040005 1147.54853 1.4344357 2 1
## 1013 52.517389 13.3951309 1206.57883 1.5082235 5 4
## 1014 44.436141 26.1027202 1296.59433 1.6207429 1 1
## 1015 52.479699 -1.9026911 1347.91851 1.6848981 4 3
## 1016 51.886965 0.2441929 1258.78413 1.5734802 3 1
## 1017 40.416782 -3.7035070 1761.00167 2.2012521 2 1
## 1018 54.898214 23.9044817 1964.33383 2.4554173 1 1
## 1019 45.437191 12.3345898 936.97509 1.1712189 3 4
## 1020 37.016294 -7.9351820 1929.05933 2.4113242 1 1
## 1021 41.893320 12.4829321 1930.32461 2.4129058 2 2
## 1022 51.886965 0.2441929 1140.97023 1.4262128 2 3
## 1023 36.721303 -4.4216366 1870.03592 2.3375449 3 3
## 1024 40.635860 17.6884975 1827.73820 2.2846727 4 1
## 1025 53.349379 -6.2605593 308.27640 0.3853455 1 1
## 1026 41.893320 12.4829321 687.99746 0.8599968 5 5
## 1027 54.973847 -1.6131572 2040.01428 2.5500179 3 2
## 1028 52.517389 13.3951309 988.54243 1.2356780 3 3
## 1029 41.150219 -8.6103497 1513.70408 1.8921301 4 3
## 1030 37.502361 15.0873718 1011.50798 1.2643850 3 3
## 1031 50.110644 8.6820917 1093.20796 1.3665099 1 2
## 1032 45.464194 9.1896346 1517.83187 1.8972898 2 1
## 1033 52.517389 13.3951309 900.58056 1.1257257 1 1
## 1034 34.774399 32.4231586 370.19802 0.4627475 2 2
## 1035 40.416782 -3.7035070 1190.40488 1.4880061 3 3
## 1036 51.886965 0.2441929 1016.29719 1.2703715 5 2
## 1037 52.517389 13.3951309 3424.16247 4.2802031 1 2
## 1038 59.325117 18.0710935 1879.99995 2.3499999 4 3
## 1039 35.888599 14.4476911 8508.21053 10.6352632 1 1
## 1040 41.382580 2.1770730 205.27784 0.2565973 4 2
## 1041 41.382580 2.1770730 1391.72247 1.7396531 4 1
## 1042 50.867782 7.1389610 1121.23650 1.4015456 1 1
## 1043 45.442498 10.9857377 1222.91580 1.5286447 1 1
## 1044 38.707751 -9.1365919 2201.46757 2.7518345 5 1
## 1045 50.110644 8.6820917 7336.79463 9.1709933 5 2
## 1046 51.886965 0.2441929 1436.40256 1.7955032 1 1
## 1047 52.373080 4.8924534 1886.50586 2.3581323 2 1
## 1048 28.293578 -16.6214471 2241.57861 2.8019733 1 2
## 1049 33.959768 -83.3763980 8017.96681 10.0224585 1 2
## 1050 51.886965 0.2441929 1371.04987 1.7138123 1 1
## 1051 53.349379 -6.2605593 1899.97852 2.3749732 1 3
## 1052 51.886965 0.2441929 914.11278 1.1426410 2 2
## 1053 45.835424 1.2644847 677.10537 0.8463817 1 2
## 1054 53.349379 -6.2605593 448.93454 0.5611682 5 5
## 1055 53.349379 -6.2605593 469.44046 0.5868006 2 2
## 1056 41.893320 12.4829321 2254.17397 2.8177175 2 2
## 1057 41.382580 2.1770730 1141.77306 1.4272163 2 1
## 1058 44.493820 11.3426327 1615.63300 2.0195412 4 4
## 1059 40.640317 22.9352716 733.74651 0.9171831 5 3
## 1060 53.349379 -6.2605593 469.44046 0.5868006 5 4
## 1061 51.453802 -2.5972985 1658.82276 2.0735284 1 1
## 1062 50.059629 14.4464593 1038.57664 1.2982208 1 2
## 1063 53.349379 -6.2605593 334.83969 0.4185496 2 1
## 1064 43.213036 2.3491069 942.98760 1.1787345 5 4
## 1065 51.886965 0.2441929 6974.53420 8.7181677 4 4
## 1066 40.416782 -3.7035070 1366.43860 1.7080482 1 1
## 1067 51.886965 0.2441929 1840.91019 2.3011377 1 1
## 1068 39.569582 2.6500745 1382.09416 1.7276177 1 1
## 1069 38.707751 -9.1365919 1941.33280 2.4266660 1 1
## 1070 44.436141 26.1027202 2080.17164 2.6002145 1 1
## 1071 54.597580 -5.9277097 516.67856 0.6458482 1 1
## 1072 54.898214 23.9044817 2596.66245 3.2458281 1 4
## 1073 53.550341 10.0006540 684.14035 0.8551754 1 1
## 1074 53.349379 -6.2605593 469.44046 0.5868006 1 3
## 1075 41.893320 12.4829321 860.02254 1.0750282 4 4
## 1076 42.697703 23.3217359 2456.34151 3.0704269 4 2
## 1077 51.886965 0.2441929 469.44046 0.5868006 1 1
## 1078 38.343637 -0.4881708 1687.71967 2.1096496 1 2
## 1079 44.116859 15.2353257 1396.30156 1.7453769 1 1
## 1080 39.569582 2.6500745 1590.24409 1.9878051 3 2
## 1081 53.349379 -6.2605593 217.61658 0.2720207 5 4
## 1082 44.436141 26.1027202 2096.19014 2.6202377 3 3
## 1083 44.853457 0.4875310 927.96126 1.1599516 5 4
## 1084 41.150219 -8.6103497 1213.99210 1.5174901 1 1
## 1085 36.721303 -4.4216366 571.55730 0.7144466 1 1
## 1086 50.059629 14.4464593 1257.27861 1.5715983 3 2
## 1087 37.016294 -7.9351820 2135.12424 2.6689053 4 3
## 1088 51.448557 5.4501225 839.60777 1.0495097 1 5
## 1089 53.349379 -6.2605593 308.27640 0.3853455 1 2
## 1090 50.061947 19.9368564 1074.89894 1.3436237 2 1
## 1091 50.720151 -1.8799118 1288.77018 1.6109627 1 4
## 1092 53.479489 -2.2451148 811.36966 1.0142121 1 1
## 1093 40.635860 17.6884975 659.84513 0.8248064 5 2
## 1094 51.886965 0.2441929 2036.93129 2.5461641 1 2
## 1095 56.949398 24.1051846 1638.05473 2.0475684 3 1
## 1096 51.886965 0.2441929 505.52671 0.6319084 1 1
## 1097 41.800289 12.6004706 1091.36561 1.3642070 4 2
## 1098 52.373080 4.8924534 758.19438 0.9477430 4 3
## 1099 28.400377 -14.0048697 2946.98191 3.6837274 2 1
## 1100 51.453802 -2.5972985 1459.80875 1.8247609 1 1
## 1101 47.497879 19.0402383 810.58091 1.0132261 3 1
## 1102 53.479489 -2.2451148 267.35412 0.3341927 5 5
## 1103 41.382580 2.1770730 1391.72247 1.7396531 5 4
## 1104 53.118818 -1.2597069 1863.13444 2.3289180 1 1
## 1105 52.106323 0.6909612 672.11741 0.8401468 4 2
## 1106 30.420516 -9.5838532 2551.76358 3.1897045 4 3
## 1107 51.886965 0.2441929 1724.90065 2.1561258 1 1
## 1108 53.349379 -6.2605593 427.19484 0.5339936 1 1
## 1109 47.497879 19.0402383 1899.97852 2.3749732 1 1
## 1110 53.479489 -2.2451148 1872.37635 2.3404704 1 1
## 1111 50.938361 6.9599740 490.76946 0.6134618 1 2
## 1112 45.464194 9.1896346 1011.50798 1.2643850 4 3
## 1113 52.233374 21.0711489 306.05630 0.3825704 4 3
## 1114 41.893320 12.4829321 1888.71734 2.3608967 5 4
## 1115 41.382580 2.1770730 1014.96791 1.2687099 3 1
## 1116 42.697703 23.3217359 2012.23210 2.5152901 4 4
## 1117 43.604464 1.4442433 554.06212 0.6925776 3 2
## 1118 40.416782 -3.7035070 1456.33139 1.8204142 5 4
## 1119 36.721303 -4.4216366 1762.23765 2.2027971 1 1
## 1120 41.800289 12.6004706 1375.97546 1.7199693 5 4
## 1121 41.893320 12.4829321 1446.62255 1.8082782 1 1
## 1122 49.418616 2.0958657 727.01612 0.9087701 3 3
## 1123 51.886965 0.2441929 1677.17668 2.0964708 1 1
## 1124 51.886965 0.2441929 1118.56538 1.3982067 2 2
## 1125 41.893320 12.4829321 1977.33888 2.4716736 2 1
## 1126 51.886965 0.2441929 2009.70067 2.5121258 1 2
## 1127 51.878102 -0.3664255 431.33928 0.5391741 4 2
## 1128 41.382580 2.1770730 205.27784 0.2565973 1 1
## 1129 53.349379 -6.2605593 1302.33278 1.6279160 1 5
## 1130 51.886965 0.2441929 900.58056 1.1257257 1 2
## 1131 38.707751 -9.1365919 1488.95281 1.8611910 5 3
## 1132 41.893320 12.4829321 1183.12092 1.4789012 1 2
## 1133 33.959768 -83.3763980 9286.52715 11.6081589 1 1
## 1134 51.886965 0.2441929 6713.72206 8.3921526 5 4
## 1135 55.861155 -4.2501687 308.27640 0.3853455 5 3
## 1136 53.349379 -6.2605593 351.13059 0.4389132 1 1
## 1137 51.886965 0.2441929 1446.62255 1.8082782 5 2
## 1138 38.343637 -0.4881708 1687.71967 2.1096496 5 2
## 1139 41.893320 12.4829321 1690.88215 2.1136027 1 1
## 1140 52.479699 -1.9026911 2195.89818 2.7448727 4 3
## 1141 50.463637 4.4661733 1143.75045 1.4296881 5 5
## 1142 53.349379 -6.2605593 2264.95754 2.8311969 1 1
## 1143 45.607370 9.5418715 1219.38374 1.5242297 2 2
## 1144 55.953346 -3.1883749 533.68115 0.6671014 1 1
## 1145 51.886965 0.2441929 590.22202 0.7377775 2 1
## 1146 42.237660 -8.7247205 1576.74620 1.9709327 2 2
## 1147 33.959768 -83.3763980 9211.04557 11.5138070 4 2
## 1148 50.061947 19.9368564 1419.57075 1.7744634 2 1
## 1149 36.721303 -4.4216366 1643.35969 2.0541996 2 1
## 1150 33.959768 -83.3763980 6713.72206 8.3921526 1 2
## 1151 50.013319 22.0161677 1556.43060 1.9455382 1 1
## 1152 52.517389 13.3951309 469.72078 0.5871510 5 3
## 1153 46.580260 0.3401960 590.22202 0.7377775 3 2
## 1154 39.469707 -0.3763353 1380.94853 1.7261857 1 1
## 1155 51.891073 -0.4230304 1545.56074 1.9319509 1 1
## 1156 38.707751 -9.1365919 1816.18160 2.2702270 3 1
## 1157 33.959768 -83.3763980 6713.72206 8.3921526 3 1
## 1158 53.118818 -1.2597069 1681.22064 2.1015258 2 2
## 1159 53.349379 -6.2605593 1819.81764 2.2747721 1 3
## 1160 44.436141 26.1027202 1172.98466 1.4662308 5 4
## 1161 39.569582 2.6500745 1622.31383 2.0278923 4 3
## 1162 41.893320 12.4829321 1446.62255 1.8082782 2 2
## 1163 41.382580 2.1770730 1666.54835 2.0831854 1 2
## 1164 51.898514 -8.4726423 599.72748 0.7496594 4 3
## 1165 53.479489 -2.2451148 1190.66588 1.4883324 5 3
## 1166 53.479489 -2.2451148 1190.66588 1.4883324 5 3
## 1167 41.893320 12.4829321 1446.62255 1.8082782 4 3
## 1168 45.753836 21.2257474 410.79382 0.5134923 3 1
## 1169 50.100869 8.6748912 872.80936 1.0910117 3 3
## 1170 34.034653 -5.0161926 2027.82544 2.5347818 4 1
## 1171 52.502539 -3.2573033 872.80936 1.0910117 2 4
## 1172 53.349379 -6.2605593 326.50928 0.4081366 3 2
## 1173 55.686724 12.5700724 1242.75739 1.5534467 5 1
## 1174 54.597580 -5.9277097 516.67856 0.6458482 5 3
## 1175 53.479489 -2.2451148 267.35412 0.3341927 3 1
## 1176 50.938361 6.9599740 498.98448 0.6237306 4 3
## 1177 33.959768 -83.3763980 9286.52715 11.6081589 1 3
## 1178 29.039708 -13.6362916 3027.11894 3.7838987 4 3
## 1179 53.349379 -6.2605593 267.35412 0.3341927 5 3
## 1180 38.707751 -9.1365919 1449.66846 1.8120856 5 3
## 1181 37.739340 -25.6689503 1449.66846 1.8120856 5 3
## 1182 38.343637 -0.4881708 1685.26688 2.1065836 2 3
## 1183 52.373080 4.8924534 758.19438 0.9477430 2 3
## 1184 42.697703 23.3217359 8720.89635 10.9011204 5 4
## 1185 51.544096 -0.0040005 1731.52492 2.1644061 4 3
## 1186 41.382580 2.1770730 908.63834 1.1357979 5 5
## 1187 41.382580 2.1770730 1666.54835 2.0831854 5 4
## 1188 40.640317 22.9352716 8828.67153 11.0358394 5 2
## 1189 53.797418 -1.5437941 316.35168 0.3954396 5 4
## 1190 38.707751 -9.1365919 1449.66846 1.8120856 4 4
## 1191 37.739340 -25.6689503 1449.66846 1.8120856 4 1
## 1192 35.888599 14.4476911 2248.56233 2.8107029 5 2
## 1193 35.888599 14.4476911 2104.39295 2.6304912 5 4
## 1194 53.407199 -2.9916800 394.66586 0.4933323 2 4
## 1195 52.546193 21.2073404 7436.84130 9.2960516 5 1
## 1196 53.428292 -6.2472741 1480.07981 1.8500998 5 3
## 1197 55.950129 -3.3595080 1938.56161 2.4232020 3 1
## 1198 47.435273 19.2535106 1918.03165 2.3975396 4 1
## 1199 51.886965 0.2441929 2995.33346 3.7441668 2 1
## 1200 41.882782 12.4887255 1938.56161 2.4232020 2 2
## 1201 51.382970 -2.7186238 1566.38693 1.9579837 5 4
## 1202 52.546193 21.2073404 1715.15500 2.1439438 5 2
## 1203 51.154077 -0.1823226 484.82016 0.6060252 5 4
## 1204 39.553225 2.7290310 709.40190 0.8867524 3 2
## 1205 52.546193 21.2073404 1429.57329 1.7869666 5 5
## 1206 55.686724 12.5700724 1239.00063 1.5487508 1 1
## 1207 55.686724 12.5700724 706.42261 0.8830283 4 3
## 1208 55.350000 23.7499997 706.42261 0.8830283 5 5
## 1209 54.193680 -4.5591148 1827.38752 2.2842344 1 1
## 1210 45.649090 12.1966848 868.00402 1.0850050 5 3
## 1211 51.886965 0.2441929 539.47133 0.6743392 5 3
## 1212 36.678545 -4.4999552 1946.64173 2.4333022 3 2
## 1213 52.420564 16.8317925 1134.34802 1.4179350 5 2
## 1214 41.815391 12.2264848 838.70632 1.0483829 5 4
## 1215 52.698684 -8.9215548 631.41418 0.7892677 4 2
## 1216 54.634968 25.2905394 356.47830 0.4455979 5 4
## 1217 37.739340 -25.6689503 1449.96803 1.8124600 4 3
## 1218 38.780954 -9.1319006 1872.05946 2.3400743 5 3
## 1219 46.850610 1.7047947 1031.40397 1.2892550 5 4
## 1220 41.799547 12.5912711 1872.05946 2.3400743 5 3
## 1221 38.780954 -9.1319006 1449.96803 1.8124600 5 2
## 1222 41.815391 12.2264848 1441.37526 1.8017191 3 4
## 1223 36.678545 -4.4999552 1946.64173 2.4333022 5 3
## 1224 52.546193 21.2073404 585.43287 0.7317911 1 2
## 1225 38.780954 -9.1319006 1872.05946 2.3400743 3 4
## 1226 45.629627 8.7235475 1487.03223 1.8587903 5 4
## 1227 41.248962 -8.6802796 276.73305 0.3459163 5 4
## 1228 41.799547 12.5912711 1460.33017 1.8254127 4 2
## 1229 51.154077 -0.1823226 484.82016 0.6060252 4 4
## 1230 45.649090 12.1966848 1117.08183 1.3963523 1 5
## 1231 37.417703 -5.8949287 5903.92881 7.3799110 3 4
## 1232 54.634968 25.2905394 356.47830 0.4455979 5 3
## 1233 55.950129 -3.3595080 996.76548 1.2459568 1 1
## 1234 51.506597 -0.0263444 1469.98477 1.8374810 5 5
## 1235 58.792474 16.9140410 815.81150 1.0197644 4 3
## 1236 59.414383 24.8368511 1746.05030 2.1825629 2 2
## 1237 39.553225 2.7290310 1381.08056 1.7263507 3 1
## 1238 41.882782 12.4887255 1447.85389 1.8098174 5 4
## 1239 51.886965 0.2441929 785.50276 0.9818785 2 1
## 1240 51.886965 0.2441929 1447.85389 1.8098174 5 5
## 1241 51.382970 -2.7186238 330.78586 0.4134823 5 2
## 1242 28.447124 -13.8661476 2891.76073 3.6147009 5 3
## 1243 40.416782 -3.7035070 1533.00212 1.9162526 2 1
## 1244 44.534431 11.2884470 1036.46069 1.2955759 3 1
## 1245 41.248962 -8.6802796 1562.27391 1.9528424 4 2
## 1246 43.426929 -3.8242722 1393.25528 1.7415691 4 3
## 1247 52.326980 4.7415053 749.14062 0.9364258 1 2
## 1248 51.382970 -2.7186238 598.36350 0.7479544 3 4
## 1249 48.170844 17.2100407 563.52017 0.7044002 5 3
## 1250 28.046141 -16.5720078 2949.83850 3.6872981 1 1
## 1251 52.546193 21.2073404 563.52017 0.7044002 5 3
## 1252 41.248962 -8.6802796 429.76289 0.5372036 5 3
## 1253 50.463637 4.4661733 835.18308 1.0439789 5 2
## 1254 55.350000 23.7499997 1195.77461 1.4947183 4 3
## 1255 66.069879 22.6978451 1195.77461 1.4947183 3 2
## 1256 50.867782 7.1389610 988.57197 1.2357150 5 5
## 1257 51.886965 0.2441929 10624.88593 13.2811074 3 2
## 1258 41.382580 2.1770730 908.63834 1.1357979 1 1
## 1259 66.069879 22.6978451 6755.13304 8.4439163 1 1
## 1260 41.882782 12.4887255 1566.38693 1.9579837 4 2
## 1261 46.850610 1.7047947 924.50420 1.1556302 1 1
## 1262 41.382580 2.1770730 1509.50370 1.8868796 4 2
## 1263 45.397173 10.8858959 1063.78855 1.3297357 5 3
## 1264 36.678545 -4.4999552 1813.54686 2.2669336 5 3
## 1265 51.506597 -0.0263444 1345.58637 1.6819830 3 3
## 1266 51.886965 0.2441929 1730.88634 2.1636079 2 3
## 1267 58.792474 16.9140410 1301.78705 1.6272338 1 3
## 1268 45.629627 8.7235475 933.05323 1.1663165 5 3
## 1269 40.461561 9.1898290 1443.18366 1.8039796 2 3
## 1270 43.758495 4.4153890 1191.01678 1.4887710 3 3
## 1271 66.069879 22.6978451 6755.13304 8.4439163 5 4
## 1272 39.105639 -83.0611404 6364.68244 7.9558530 2 2
## 1273 51.886965 0.2441929 2147.01557 2.6837695 1 1
## 1274 50.867782 7.1389610 1679.84167 2.0998021 3 3
## 1275 51.886965 0.2441929 1443.18366 1.8039796 4 3
## 1276 41.882782 12.4887255 1710.76157 2.1384520 4 1
## 1277 28.495156 -81.3111658 6821.82332 8.5272792 3 3
## 1278 38.284418 -0.5657529 1794.29221 2.2428653 5 4
## 1279 51.886965 0.2441929 10078.90476 12.5986309 5 4
## 1280 36.678545 -4.4999552 1866.38321 2.3329790 5 3
## 1281 49.454322 2.1116687 699.10435 0.8738804 4 4
## 1282 37.434993 25.3473265 8733.52484 10.9169061 1 1
## 1283 41.815391 12.2264848 838.70632 1.0483829 1 1
## 1284 51.154077 -0.1823226 562.74981 0.7034373 5 3
## 1285 41.882782 12.4887255 1938.56161 2.4232020 1 1
## 1286 44.568339 26.1025536 2072.26923 2.5903365 5 3
## 1287 35.847410 14.4922871 2113.36681 2.6417085 5 4
## 1288 52.546193 21.2073404 1167.47060 1.4593382 5 3
## 1289 50.867782 7.1389610 493.06224 0.6163278 5 4
## 1290 41.382580 2.1770730 1509.50370 1.8868796 1 1
## 1291 54.193680 -4.5591148 1747.95624 2.1849453 5 4
## 1292 27.930162 -15.3880130 4362.09500 5.4526188 2 1
## 1293 51.154077 -0.1823226 484.82016 0.6060252 1 1
## 1294 46.850610 1.7047947 6625.46167 8.2818271 5 3
## 1295 51.154077 -0.1823226 624.80971 0.7810121 1 1
## 1296 55.686724 12.5700724 706.42261 0.8830283 1 1
## 1297 38.780954 -9.1319006 1628.36021 2.0354503 5 4
## 1298 36.678545 -4.4999552 1855.61978 2.3195247 4 3
## 1299 53.428292 -6.2472741 330.78586 0.4134823 4 2
## 1300 38.284418 -0.5657529 6904.39690 8.6304961 4 4
## 1301 41.248962 -8.6802796 429.76289 0.5372036 5 4
## 1302 51.103783 16.8885446 1156.64882 1.4458110 5 3
## 1303 54.193680 -4.5591148 140.07680 0.1750960 5 5
## 1304 41.799547 12.5912711 1460.33017 1.8254127 5 3
## 1305 51.886965 0.2441929 1447.85389 1.8098174 5 3
## 1306 53.336052 -2.8494284 1589.69701 1.9871213 5 4
## 1307 51.506597 -0.0263444 1456.70658 1.8208832 2 2
## 1308 44.477762 8.7026296 1016.01798 1.2700225 4 3
## 1309 66.069879 22.6978451 2063.13133 2.5789142 3 2
## 1310 54.193680 -4.5591148 1946.64173 2.4333022 2 2
## 1311 28.447124 -13.8661476 2993.45343 3.7418168 5 4
## 1312 48.170844 17.2100407 1654.36605 2.0679576 3 2
## 1313 51.886965 0.2441929 1310.41113 1.6380139 5 4
## 1314 57.662415 12.2877630 1004.47319 1.2555915 5 3
## 1315 44.590122 7.0582549 681.45787 0.8518223 5 2
## 1316 36.678545 -4.4999552 1866.38321 2.3329790 4 3
## 1317 54.652656 -6.2287441 562.74981 0.7034373 5 5
## 1318 51.886965 0.2441929 9162.57521 11.4532190 5 3
## 1319 35.847410 14.4922871 2280.03672 2.8500459 5 3
## 1320 40.519802 22.9740868 8355.28108 10.4441014 5 3
## 1321 53.428292 -6.2472741 295.92278 0.3699035 5 3
## 1322 53.428292 -6.2472741 1779.62474 2.2245309 1 1
## 1323 52.454185 -1.7438663 1577.45887 1.9718236 1 1
## 1324 36.678545 -4.4999552 1714.13918 2.1426740 4 2
## 1325 55.350000 23.7499997 706.42261 0.8830283 5 5
## 1326 52.546193 21.2073404 1834.96308 2.2937039 5 3
## 1327 50.900900 4.4809649 765.52262 0.9569033 3 1
## 1328 53.428292 -6.2472741 321.51055 0.4018882 3 4
## 1329 51.886965 0.2441929 10078.90476 12.5986309 5 3
## 1330 51.886965 0.2441929 1280.45772 1.6005722 5 2
## 1331 51.886965 0.2441929 1443.18366 1.8039796 3 2
## 1332 49.746322 3.0733031 1556.10838 1.9451355 5 4
## 1333 51.886965 0.2441929 1176.93267 1.4711658 5 3
## 1334 52.163065 20.9708149 969.38958 1.2117370 3 2
## 1335 51.886965 0.2441929 601.57989 0.7519749 3 2
## 1336 38.176517 13.0916430 1467.66739 1.8345842 4 2
## 1337 43.426929 -3.8242722 1003.86052 1.2548257 5 2
## 1338 53.428292 -6.2472741 473.55540 0.5919443 5 3
## 1339 41.382580 2.1770730 1072.72436 1.3409054 1 1
## 1340 28.046141 -16.5720078 3195.19418 3.9939927 5 4
## 1341 46.850610 1.7047947 1798.94174 2.2486772 5 5
## 1342 53.866650 -1.6567819 307.40151 0.3842519 5 4
## 1343 36.399662 25.4767089 8817.95319 11.0224415 5 5
## 1344 41.382580 2.1770730 1669.15586 2.0864448 1 2
## 1345 51.886965 0.2441929 2027.82544 2.5347818 5 4
## 1346 34.034653 -5.0161926 2027.82544 2.5347818 5 5
## 1347 39.553225 2.7290310 1861.53974 2.3269247 5 3
## 1348 36.678545 -4.4999552 1691.26917 2.1140865 1 2
## 1349 36.678545 -4.4999552 1685.28279 2.1066035 3 3
## 1350 53.428292 -6.2472741 140.07680 0.1750960 5 3
## 1351 37.417703 -5.8949287 5903.92881 7.3799110 3 3
## 1352 28.963968 -13.5499014 2925.88706 3.6573588 4 3
## 1353 53.866650 -1.6567819 816.03056 1.0200382 5 3
## 1354 55.950129 -3.3595080 1974.94485 2.4686811 1 2
## 1355 53.428292 -6.2472741 321.51055 0.4018882 5 3
## 1356 41.799547 12.5912711 1870.96389 2.3387049 5 2
## 1357 53.428292 -6.2472741 749.14062 0.9364258 5 4
## 1358 35.847410 14.4922871 2280.03672 2.8500459 3 1
## 1359 51.154077 -0.1823226 484.82016 0.6060252 5 3
## 1360 28.046141 -16.5720078 2976.06877 3.7200860 4 2
## 1361 45.649090 12.1966848 937.60616 1.1720077 5 4
## 1362 53.428292 -6.2472741 1239.00063 1.5487508 5 3
## 1363 41.382580 2.1770730 838.70632 1.0483829 1 1
## 1364 41.382580 2.1770730 879.07748 1.0988469 1 3
## 1365 54.193680 -4.5591148 1747.95624 2.1849453 1 2
## 1366 54.193680 -4.5591148 3047.42170 3.8092771 4 3
## 1367 41.882782 12.4887255 1858.46067 2.3230758 3 3
## 1368 51.154077 -0.1823226 484.82016 0.6060252 1 1
## 1369 46.850610 1.7047947 1798.94174 2.2486772 1 1
## 1370 -19.916082 -175.2026420 17593.97259 21.9924657 5 2
## 1371 46.850610 1.7047947 670.95560 0.8386945 1 1
## 1372 36.678545 -4.4999552 1946.64173 2.4333022 1 1
## 1373 54.193680 -4.5591148 741.31860 0.9266482 5 3
## 1374 45.528878 9.0415600 708.36940 0.8854617 5 2
## 1375 28.495156 -81.3111658 7672.90897 9.5911362 1 1
## 1376 52.056811 4.5386252 442.08824 0.5526103 2 1
## 1377 54.898214 23.9044817 1640.79050 2.0509881 1 1
## 1378 41.662967 -1.0378996 972.61086 1.2157636 3 2
## 1379 36.721303 -4.4216366 1853.43200 2.3167900 5 2
## 1380 36.721303 -4.4216366 1724.90065 2.1561258 1 1
## 1381 40.416782 -3.7035070 1315.52616 1.6444077 5 2
## 1382 51.453802 -2.5972985 326.50928 0.4081366 1 1
## 1383 45.835424 1.2644847 896.13130 1.1201641 5 4
## 1384 53.349379 -6.2605593 758.19438 0.9477430 4 3
## 1385 50.846557 4.3516970 757.13159 0.9464145 5 2
## 1386 35.888599 14.4476911 2523.69778 3.1546222 1 1
## 1387 53.349379 -6.2605593 267.35412 0.3341927 5 3
## 1388 51.389344 -0.0559576 475.33916 0.5941739 1 1
## 1389 28.963968 -13.5499014 2782.48700 3.4781088 4 2
## 1390 41.382580 2.1770730 1139.17181 1.4239648 1 1
## 1391 45.464194 9.1896346 1535.96881 1.9199610 3 2
## 1392 53.407199 -2.9916800 217.61658 0.2720207 1 1
## 1393 52.479699 -1.9026911 2855.25337 3.5690667 3 2
## 1394 40.416782 -3.7035070 2297.79994 2.8722499 4 1
## 1395 50.463637 4.4661733 794.51228 0.9931404 2 2
## 1396 54.193680 -4.5591148 10365.55662 12.9569458 5 3
## 1397 53.118818 -1.2597069 830.30717 1.0378840 5 3
## 1398 41.382580 2.1770730 1500.03969 1.8750496 4 4
## 1399 38.707751 -9.1365919 1635.97697 2.0449712 3 1
## 1400 45.806691 12.2063158 1105.83659 1.3822957 2 2
## 1401 57.707233 11.9670171 991.71454 1.2396432 5 5
## 1402 53.407199 -2.9916800 1857.67423 2.3220928 5 3
## 1403 38.707751 -9.1365919 1635.97697 2.0449712 5 5
## 1404 51.886965 0.2441929 2972.09945 3.7151243 1 1
## 1405 51.886965 0.2441929 6215.12744 7.7689093 5 3
## 1406 43.342656 3.2131307 1196.54633 1.4956829 5 5
## 1407 27.930162 -15.3880130 6264.42358 7.8305295 4 3
## 1408 27.930162 -15.3880130 2187.24022 2.7340503 1 4
## 1409 39.569582 2.6500745 1881.62744 2.3520343 4 5
## 1410 50.846557 4.3516970 971.32382 1.2141548 5 4
## 1411 53.349379 -6.2605593 326.50928 0.4081366 4 3
## 1412 39.469707 -0.3763353 1380.49364 1.7256171 1 1
## 1413 41.815391 12.2264848 1171.24296 1.4640537 4 2
## 1414 53.349379 -6.2605593 1472.80072 1.8410009 5 4
## 1415 36.681694 -6.1377402 1762.99485 2.2037436 2 1
## 1416 35.512083 24.0191544 9244.03567 11.5550446 2 1
## 1417 33.959768 -83.3763980 6702.57648 8.3782206 5 3
## 1418 53.479489 -2.2451148 537.81453 0.6722682 5 3
## 1419 41.800289 12.6004706 1136.21824 1.4202728 5 4
## 1420 51.507446 -0.1277653 1206.44222 1.5080528 1 1
## 1421 53.349379 -6.2605593 823.62548 1.0295319 4 2
## 1422 51.544096 -0.0040005 822.47630 1.0280954 5 4
## 1423 45.649648 13.7772781 561.20933 0.7015117 3 2
## 1424 43.426929 -3.8242722 1113.35140 1.3916892 4 2
## 1425 51.544096 -0.0040005 1334.84787 1.6685598 3 3
## 1426 53.349379 -6.2605593 469.44046 0.5868006 3 1
## 1427 51.886965 0.2441929 505.52671 0.6319084 2 3
## 1428 43.684794 10.3955270 1185.27547 1.4815943 5 2
## 1429 43.296174 5.3699525 990.31292 1.2378911 4 3
## 1430 53.428292 -6.2472741 484.82016 0.6060252 3 2
## 1431 55.670249 10.3333283 832.04412 1.0400552 2 3
## 1432 55.953346 -3.1883749 1968.02921 2.4600365 4 3
## 1433 47.988824 10.2350723 837.01877 1.0462735 5 5
## 1434 35.512083 24.0191544 9244.03567 11.5550446 1 1
## 1435 51.891073 -0.4230304 2943.76251 3.6797031 4 4
## 1436 41.979301 2.8199439 1036.23346 1.2952918 5 5
## 1437 43.296174 5.3699525 1029.36239 1.2867030 2 2
## 1438 39.591337 19.8596189 2275.66551 2.8445819 5 2
## 1439 37.016294 -7.9351820 462.63505 0.5782938 1 1
## 1440 45.464194 9.1896346 1214.28642 1.5178580 1 1
## 1441 39.569582 2.6500745 1288.77018 1.6109627 5 3
## 1442 49.944633 7.2612103 1208.66178 1.5108272 5 5
## 1443 51.886965 0.2441929 1310.41113 1.6380139 1 1
## 1444 53.118818 -1.2597069 2274.92130 2.8436516 2 1
## 1445 51.453802 -2.5972985 686.29411 0.8578676 5 4
## 1446 51.507446 -0.1277653 348.37810 0.4354726 2 1
## 1447 41.800289 12.6004706 8031.57813 10.0394727 5 1
## 1448 52.479699 -1.9026911 2782.48700 3.4781088 4 4
## 1449 43.461893 -3.8100255 1114.15910 1.3926989 4 3
## 1450 52.450886 20.6489881 1143.75045 1.4296881 5 4
## 1451 51.108978 17.0326689 1603.55557 2.0044445 5 4
## 1452 53.349379 -6.2605593 308.65595 0.3858199 1 1
## 1453 51.507446 -0.1277653 387.47946 0.4843493 1 1
## 1454 50.061947 19.9368564 1393.55667 1.7419458 3 4
## 1455 51.453802 -2.5972985 326.50928 0.4081366 1 1
## 1456 40.416782 -3.7035070 557.59008 0.6969876 2 3
## 1457 41.893320 12.4829321 4330.68989 5.4133624 1 3
## 1458 53.349379 -6.2605593 464.57804 0.5807226 1 2
## 1459 41.652134 -0.8809428 1140.97023 1.4262128 2 2
## 1460 53.349379 -6.2605593 351.13059 0.4389132 5 4
## 1461 53.045342 8.7896417 10628.03963 13.2850495 1 1
## 1462 51.886965 0.2441929 1762.99485 2.2037436 3 4
## 1463 47.497879 19.0402383 1436.40256 1.7955032 1 1
## 1464 37.149805 -91.4328245 6747.10415 8.4338802 5 3
## 1465 51.886965 0.2441929 2036.93129 2.5461641 1 1
## 1466 36.721303 -4.4216366 1857.67423 2.3220928 1 1
## 1467 39.105639 -83.0611404 6157.22000 7.6965250 4 3
## 1468 53.118818 -1.2597069 1535.28393 1.9191049 5 4
## 1469 53.866650 -1.6567819 1917.41837 2.3967730 5 3
## 1470 53.349379 -6.2605593 217.61658 0.2720207 5 5
## 1471 36.721303 -4.4216366 1853.43200 2.3167900 3 2
## 1472 53.348265 -6.2479785 324.92279 0.4061535 2 1
## 1473 51.886965 0.2441929 1310.41113 1.6380139 4 3
## 1474 52.233374 21.0711489 1619.70472 2.0246309 5 2
## 1475 55.861155 -4.2501687 531.77597 0.6647200 5 3
## 1476 53.349379 -6.2605593 267.35412 0.3341927 4 3
## 1477 41.893320 12.4829321 1533.90854 1.9173857 1 1
## 1478 41.248962 -8.6802796 1569.63370 1.9620421 4 1
## 1479 41.324633 2.0952568 1396.27378 1.7453422 5 4
## 1480 41.248962 -8.6802796 908.63834 1.1357979 5 1
## 1481 41.125784 16.8620293 1474.66246 1.8433281 4 3
## 1482 40.416782 -3.7035070 1431.32963 1.7891620 4 1
## 1483 55.502305 -4.5775966 2526.87623 3.1585953 1 1
## 1484 40.558729 8.3153206 719.04039 0.8988005 5 3
## 1485 28.400377 -14.0048697 2938.12802 3.6726600 1 1
## 1486 36.407111 25.4566637 9286.52715 11.6081589 3 2
## 1487 51.886965 0.2441929 1310.41113 1.6380139 5 4
## 1488 37.992379 -1.1305431 1611.18485 2.0139811 1 1
## 1489 33.959768 -83.3763980 6713.72206 8.3921526 5 3
## 1490 51.886965 0.2441929 1899.79747 2.3747468 4 4
## 1491 36.793693 27.0848266 2692.62423 3.3657803 1 1
## 1492 38.707751 -9.1365919 1635.97697 2.0449712 5 1
## 1493 53.349379 -6.2605593 308.65595 0.3858199 2 1
## 1494 36.681694 -6.1377402 1762.99485 2.2037436 1 1
## 1495 55.724702 9.1195835 723.22517 0.9040315 1 1
## 1496 29.039708 -13.6362916 2763.88386 3.4548548 1 2
## 1497 37.388630 -5.9953403 831.51368 1.0393921 1 2
## 1498 36.407111 25.4566637 9286.52715 11.6081589 1 1
## 1499 51.886965 0.2441929 1635.97697 2.0449712 2 1
## 1500 38.343637 -0.4881708 1643.27398 2.0540925 1 1
## 1501 39.613432 2.8829185 205.36145 0.2567018 1 3
## 1502 53.349379 -6.2605593 1873.87331 2.3423416 3 1
## 1503 45.607370 9.5418715 975.86240 1.2198280 1 1
## 1504 28.400377 -14.0048697 3078.62918 3.8482865 1 1
## 1505 51.891073 -0.4230304 2768.97032 3.4612129 3 2
## 1506 48.853495 2.3483915 7263.19252 9.0789906 1 1
## 1507 41.382580 2.1770730 1176.93267 1.4711658 1 2
## 1508 33.959768 -83.3763980 8047.37248 10.0592156 1 2
## 1509 51.886965 0.2441929 1381.57207 1.7269651 1 2
## 1510 35.888599 14.4476911 2104.39295 2.6304912 3 3
## 1511 53.479489 -2.2451148 1870.03592 2.3375449 1 1
## 1512 50.846557 4.3516970 721.67304 0.9020913 5 5
## 1513 50.463637 4.4661733 964.03732 1.2050467 5 4
## 1514 51.507446 -0.1277653 1436.38172 1.7954771 1 1
## 1515 38.974390 1.4197463 164.55653 0.2056957 2 2
## 1516 35.888599 14.4476911 2197.75126 2.7471891 4 3
## 1517 43.296174 5.3699525 1534.59278 1.9182410 5 3
## 1518 38.974390 1.4197463 1636.35918 2.0454490 4 4
## 1519 39.569582 2.6500745 1476.87947 1.8460993 5 5
## 1520 35.512083 24.0191544 2608.86199 3.2610775 3 1
## 1521 37.016294 -7.9351820 2070.46634 2.5880829 5 4
## 1522 39.569582 2.6500745 1535.28393 1.9191049 4 4
## 1523 35.888599 14.4476911 2356.32658 2.9454082 4 3
## 1524 55.953346 -3.1883749 351.13059 0.4389132 2 2
## 1525 41.800289 12.6004706 971.15650 1.2139456 5 4
## 1526 51.506597 -0.0263444 1469.98477 1.8374810 2 1
## 1527 51.453802 -2.5972985 1643.35969 2.0541996 1 1
## 1528 51.448557 5.4501225 800.32430 1.0004054 5 3
## 1529 48.151699 17.1093063 1631.51664 2.0393958 5 3
## 1530 34.917416 32.8899027 3204.42829 4.0055354 1 1
## 1531 59.325117 18.0710935 1466.80245 1.8335031 3 2
## 1532 59.468248 5.0827612 896.69362 1.1208670 5 4
## 1533 35.512083 24.0191544 2781.75764 3.4771970 5 5
## 1534 48.778449 9.1800132 1125.69555 1.4071194 5 3
## 1535 50.061947 19.9368564 1074.89894 1.3436237 5 5
## 1536 48.778449 9.1800132 953.87919 1.1923490 5 4
## 1537 51.544096 -0.0040005 924.58937 1.1557367 5 4
## 1538 39.569582 2.6500745 1871.82370 2.3397796 3 1
## 1539 41.125784 16.8620293 1740.97620 2.1762203 1 3
## 1540 41.382580 2.1770730 544.01295 0.6800162 5 5
## 1541 36.721303 -4.4216366 1857.67423 2.3220928 5 3
## 1542 38.707751 -9.1365919 1714.63006 2.1432876 1 2
## 1543 31.625826 -7.9891608 2417.14318 3.0214290 5 4
## 1544 52.408266 16.9335199 1141.34295 1.4266787 1 3
## 1545 40.632711 8.2883758 831.94739 1.0399342 4 2
## 1546 53.794799 -8.9193547 652.39137 0.8154892 1 3
## 1547 50.111482 22.0184362 1534.90968 1.9186371 5 2
## 1548 51.886965 0.2441929 708.12954 0.8851619 5 4
## 1549 45.437191 12.3345898 1166.48554 1.4581069 5 2
## 1550 42.593098 -83.0663730 5654.90472 7.0686309 2 3
## 1551 44.493820 11.3426327 1405.30590 1.7566324 1 1
## 1552 28.293578 -16.6214471 4088.04978 5.1100622 5 5
## 1553 39.469707 -0.3763353 1347.01415 1.6837677 5 3
## 1554 55.953346 -3.1883749 1930.32461 2.4129058 2 1
## 1555 51.886965 0.2441929 538.41307 0.6730163 5 3
## 1556 36.721303 -4.4216366 1724.90065 2.1561258 3 3
## 1557 51.507446 -0.1277653 1038.57664 1.2982208 1 1
## 1558 50.100869 8.6748912 752.62317 0.9407790 5 5
## 1559 53.349379 -6.2605593 308.27640 0.3853455 1 3
## 1560 53.349379 -6.2605593 464.57804 0.5807226 1 1
## 1561 43.094090 -0.0464975 935.38793 1.1692349 1 1
## 1562 53.349379 -6.2605593 777.80804 0.9722601 1 2
## 1563 38.974390 1.4197463 1585.50724 1.9818841 2 3
## 1564 28.334772 -10.3713379 2760.61397 3.4507675 5 3
## 1565 35.888599 14.4476911 2197.75126 2.7471891 1 1
## 1566 51.898514 -8.4726423 585.03195 0.7312899 5 4
## 1567 40.416782 -3.7035070 8469.67892 10.5870987 3 1
## 1568 53.349379 -6.2605593 217.61658 0.2720207 3 1
## 1569 28.293578 -16.6214471 3091.32987 3.8641623 2 2
## 1570 55.950129 -3.3595080 849.53562 1.0619195 5 5
## 1571 36.681694 -6.1377402 1721.34509 2.1516814 5 2
## 1572 50.463637 4.4661733 6549.10023 8.1863753 4 3
## 1573 50.900900 4.4809649 1734.64445 2.1683056 3 2
## 1574 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1575 53.118818 -1.2597069 1141.46449 1.4268306 3 2
## 1576 53.129713 18.0294488 1468.42824 1.8355353 1 3
## 1577 51.544096 -0.0040005 1417.20692 1.7715087 2 3
## 1578 53.428292 -6.2472741 471.34345 0.5891793 3 3
## 1579 16.500000 -92.5000001 8766.96493 10.9587062 3 3
## 1580 44.436141 26.1027202 2080.17164 2.6002145 5 4
## 1581 26.492533 92.3308789 0.00000 0.0000000 1 3
## 1582 26.492533 92.3308789 0.00000 0.0000000 1 4
## 1583 26.492533 92.3308789 0.00000 0.0000000 2 1
## 1584 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1585 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1586 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1587 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1588 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1589 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1590 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1591 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1592 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1593 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1594 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1595 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1596 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1597 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1598 26.492533 92.3308789 0.00000 0.0000000 3 1
## 1599 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1600 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1601 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1602 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1603 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1604 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1605 26.492533 92.3308789 0.00000 0.0000000 3 4
## 1606 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1607 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1608 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1609 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1610 26.492533 92.3308789 0.00000 0.0000000 1 2
## 1611 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1612 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1613 26.492533 92.3308789 0.00000 0.0000000 5 2
## 1614 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1615 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1616 26.492533 92.3308789 0.00000 0.0000000 3 1
## 1617 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1618 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1619 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1620 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1621 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1622 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1623 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1624 26.492533 92.3308789 0.00000 0.0000000 2 4
## 1625 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1626 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1627 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1628 26.492533 92.3308789 0.00000 0.0000000 2 4
## 1629 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1630 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1631 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1632 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1633 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1634 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1635 26.492533 92.3308789 0.00000 0.0000000 3 4
## 1636 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1637 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1638 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1639 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1640 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1641 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1642 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1643 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1644 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1645 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1646 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1647 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1648 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1649 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1650 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1651 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1652 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1653 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1654 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1655 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1656 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1657 26.492533 92.3308789 0.00000 0.0000000 2 1
## 1658 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1659 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1660 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1661 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1662 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1663 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1664 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1665 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1666 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1667 26.492533 92.3308789 0.00000 0.0000000 5 1
## 1668 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1669 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1670 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1671 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1672 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1673 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1674 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1675 26.492533 92.3308789 0.00000 0.0000000 5 2
## 1676 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1677 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1678 26.492533 92.3308789 0.00000 0.0000000 5 2
## 1679 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1680 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1681 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1682 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1683 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1684 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1685 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1686 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1687 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1688 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1689 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1690 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1691 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1692 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1693 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1694 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1695 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1696 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1697 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1698 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1699 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1700 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1701 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1702 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1703 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1704 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1705 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1706 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1707 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1708 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1709 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1710 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1711 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1712 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1713 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1714 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1715 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1716 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1717 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1718 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1719 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1720 26.492533 92.3308789 0.00000 0.0000000 5 2
## 1721 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1722 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1723 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1724 26.492533 92.3308789 0.00000 0.0000000 4 5
## 1725 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1726 26.492533 92.3308789 0.00000 0.0000000 3 4
## 1727 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1728 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1729 26.492533 92.3308789 0.00000 0.0000000 5 1
## 1730 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1731 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1732 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1733 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1734 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1735 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1736 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1737 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1738 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1739 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1740 26.492533 92.3308789 0.00000 0.0000000 4 1
## 1741 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1742 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1743 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1744 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1745 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1746 26.492533 92.3308789 0.00000 0.0000000 5 0
## 1747 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1748 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1749 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1750 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1751 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1752 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1753 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1754 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1755 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1756 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1757 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1758 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1759 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1760 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1761 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1762 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1763 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1764 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1765 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1766 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1767 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1768 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1769 26.492533 92.3308789 0.00000 0.0000000 3 4
## 1770 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1771 26.492533 92.3308789 0.00000 0.0000000 3 4
## 1772 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1773 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1774 26.492533 92.3308789 0.00000 0.0000000 4 1
## 1775 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1776 26.492533 92.3308789 0.00000 0.0000000 1 3
## 1777 26.492533 92.3308789 0.00000 0.0000000 1 3
## 1778 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1779 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1780 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1781 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1782 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1783 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1784 26.492533 92.3308789 0.00000 0.0000000 2 1
## 1785 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1786 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1787 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1788 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1789 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1790 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1791 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1792 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1793 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1794 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1795 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1796 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1797 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1798 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1799 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1800 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1801 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1802 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1803 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1804 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1805 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1806 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1807 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1808 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1809 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1810 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1811 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1812 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1813 26.492533 92.3308789 0.00000 0.0000000 5 2
## 1814 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1815 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1816 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1817 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1818 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1819 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1820 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1821 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1822 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1823 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1824 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1825 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1826 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1827 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1828 26.492533 92.3308789 0.00000 0.0000000 2 4
## 1829 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1830 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1831 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1832 26.492533 92.3308789 0.00000 0.0000000 1 3
## 1833 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1834 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1835 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1836 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1837 26.492533 92.3308789 0.00000 0.0000000 1 3
## 1838 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1839 26.492533 92.3308789 0.00000 0.0000000 1 3
## 1840 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1841 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1842 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1843 26.492533 92.3308789 0.00000 0.0000000 1 0
## 1844 26.492533 92.3308789 0.00000 0.0000000 1 3
## 1845 26.492533 92.3308789 0.00000 0.0000000 3 4
## 1846 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1847 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1848 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1849 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1850 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1851 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1852 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1853 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1854 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1855 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1856 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1857 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1858 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1859 26.492533 92.3308789 0.00000 0.0000000 1 3
## 1860 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1861 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1862 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1863 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1864 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1865 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1866 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1867 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1868 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1869 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1870 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1871 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1872 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1873 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1874 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1875 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1876 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1877 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1878 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1879 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1880 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1881 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1882 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1883 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1884 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1885 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1886 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1887 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1888 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1889 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1890 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1891 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1892 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1893 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1894 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1895 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1896 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1897 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1898 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1899 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1900 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1901 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1902 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1903 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1904 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1905 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1906 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1907 26.492533 92.3308789 0.00000 0.0000000 5 2
## 1908 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1909 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1910 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1911 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1912 26.492533 92.3308789 0.00000 0.0000000 4 1
## 1913 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1914 26.492533 92.3308789 0.00000 0.0000000 2 1
## 1915 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1916 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1917 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1918 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1919 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1920 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1921 26.492533 92.3308789 0.00000 0.0000000 0 0
## 1922 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1923 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1924 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1925 26.492533 92.3308789 0.00000 0.0000000 5 2
## 1926 26.492533 92.3308789 0.00000 0.0000000 2 3
## 1927 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1928 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1929 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1930 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1931 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1932 26.492533 92.3308789 0.00000 0.0000000 5 1
## 1933 26.492533 92.3308789 0.00000 0.0000000 4 0
## 1934 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1935 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1936 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1937 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1938 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1939 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1940 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1941 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1942 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1943 26.492533 92.3308789 0.00000 0.0000000 4 1
## 1944 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1945 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1946 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1947 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1948 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1949 26.492533 92.3308789 0.00000 0.0000000 3 4
## 1950 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1951 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1952 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1953 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1954 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1955 26.492533 92.3308789 0.00000 0.0000000 2 2
## 1956 26.492533 92.3308789 0.00000 0.0000000 1 1
## 1957 26.492533 92.3308789 0.00000 0.0000000 1 3
## 1958 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1959 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1960 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1961 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1962 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1963 26.492533 92.3308789 0.00000 0.0000000 3 4
## 1964 26.492533 92.3308789 0.00000 0.0000000 4 1
## 1965 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1966 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1967 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1968 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1969 26.492533 92.3308789 0.00000 0.0000000 5 0
## 1970 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1971 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1972 26.492533 92.3308789 0.00000 0.0000000 0 4
## 1973 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1974 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1975 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1976 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1977 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1978 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1979 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1980 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1981 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1982 26.492533 92.3308789 0.00000 0.0000000 4 2
## 1983 26.492533 92.3308789 0.00000 0.0000000 3 3
## 1984 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1985 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1986 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1987 26.492533 92.3308789 0.00000 0.0000000 2 1
## 1988 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1989 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1990 26.492533 92.3308789 0.00000 0.0000000 4 3
## 1991 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1992 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1993 26.492533 92.3308789 0.00000 0.0000000 3 2
## 1994 26.492533 92.3308789 0.00000 0.0000000 5 3
## 1995 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1996 26.492533 92.3308789 0.00000 0.0000000 4 4
## 1997 26.492533 92.3308789 0.00000 0.0000000 5 4
## 1998 26.492533 92.3308789 0.00000 0.0000000 5 5
## 1999 26.492533 92.3308789 0.00000 0.0000000 5 4
## 2000 26.492533 92.3308789 0.00000 0.0000000 3 1
## 2001 26.492533 92.3308789 0.00000 0.0000000 2 1
## 2002 26.492533 92.3308789 0.00000 0.0000000 5 5
## 2003 26.492533 92.3308789 0.00000 0.0000000 4 1
## 2004 26.492533 92.3308789 0.00000 0.0000000 5 4
## 2005 26.492533 92.3308789 0.00000 0.0000000 3 4
## 2006 26.492533 92.3308789 0.00000 0.0000000 5 4
## 2007 26.492533 92.3308789 0.00000 0.0000000 5 4
## 2008 26.492533 92.3308789 0.00000 0.0000000 1 1
## 2009 26.492533 92.3308789 0.00000 0.0000000 5 3
## 2010 26.492533 92.3308789 0.00000 0.0000000 5 4
## 2011 26.492533 92.3308789 0.00000 0.0000000 3 3
## 2012 26.492533 92.3308789 0.00000 0.0000000 3 5
## 2013 26.492533 92.3308789 0.00000 0.0000000 2 2
## 2014 26.492533 92.3308789 0.00000 0.0000000 4 4
## 2015 26.492533 92.3308789 0.00000 0.0000000 2 1
## 2016 26.492533 92.3308789 0.00000 0.0000000 2 1
## 2017 26.492533 92.3308789 0.00000 0.0000000 4 4
## 2018 26.492533 92.3308789 0.00000 0.0000000 1 2
## 2019 26.492533 92.3308789 0.00000 0.0000000 5 3
## 2020 26.492533 92.3308789 0.00000 0.0000000 2 1
## 2021 26.492533 92.3308789 0.00000 0.0000000 2 0
## 2022 26.492533 92.3308789 0.00000 0.0000000 2 3
## 2023 26.492533 92.3308789 0.00000 0.0000000 1 1
## 2024 26.492533 92.3308789 0.00000 0.0000000 4 5
## 2025 26.492533 92.3308789 0.00000 0.0000000 1 1
## 2026 26.492533 92.3308789 0.00000 0.0000000 0 2
## 2027 26.492533 92.3308789 0.00000 0.0000000 2 3
## 2028 26.492533 92.3308789 0.00000 0.0000000 5 3
## 2029 26.492533 92.3308789 0.00000 0.0000000 4 4
## 2030 26.492533 92.3308789 0.00000 0.0000000 3 3
## 2031 26.492533 92.3308789 0.00000 0.0000000 5 3
## 2032 26.492533 92.3308789 0.00000 0.0000000 5 5
## 2033 26.492533 92.3308789 0.00000 0.0000000 4 1
## 2034 26.492533 92.3308789 0.00000 0.0000000 4 5
## 2035 26.492533 92.3308789 0.00000 0.0000000 1 3
## 2036 26.492533 92.3308789 0.00000 0.0000000 4 3
## 2037 26.492533 92.3308789 0.00000 0.0000000 4 2
## 2038 26.492533 92.3308789 0.00000 0.0000000 5 5
## 2039 26.492533 92.3308789 0.00000 0.0000000 2 2
## 2040 26.492533 92.3308789 0.00000 0.0000000 4 4
## 2041 26.492533 92.3308789 0.00000 0.0000000 3 3
## 2042 26.492533 92.3308789 0.00000 0.0000000 4 4
## 2043 26.492533 92.3308789 0.00000 0.0000000 4 3
## 2044 26.492533 92.3308789 0.00000 0.0000000 2 1
## 2045 26.492533 92.3308789 0.00000 0.0000000 2 2
## 2046 26.492533 92.3308789 0.00000 0.0000000 2 2
## 2047 26.492533 92.3308789 0.00000 0.0000000 5 4
## 2048 26.492533 92.3308789 0.00000 0.0000000 4 5
## 2049 26.492533 92.3308789 0.00000 0.0000000 3 2
## 2050 26.492533 92.3308789 0.00000 0.0000000 4 4
## 2051 26.492533 92.3308789 0.00000 0.0000000 3 2
## 2052 26.492533 92.3308789 0.00000 0.0000000 1 2
## 2053 26.492533 92.3308789 0.00000 0.0000000 4 4
## 2054 26.492533 92.3308789 0.00000 0.0000000 1 2
## 2055 26.492533 92.3308789 0.00000 0.0000000 3 3
## 2056 26.492533 92.3308789 0.00000 0.0000000 4 4
## 2057 26.492533 92.3308789 0.00000 0.0000000 5 4
## 2058 26.492533 92.3308789 0.00000 0.0000000 2 3
## 2059 26.492533 92.3308789 0.00000 0.0000000 1 3
## 2060 26.492533 92.3308789 0.00000 0.0000000 1 1
## 2061 26.492533 92.3308789 0.00000 0.0000000 1 3
## 2062 26.492533 92.3308789 0.00000 0.0000000 1 1
## 2063 26.492533 92.3308789 0.00000 0.0000000 2 1
## 2064 26.492533 92.3308789 0.00000 0.0000000 1 1
## StaffService ExtraServices DurationCat DurationCatLong DurationCatMedium
## 1 4.5 1.0000000 Medium 0 1
## 2 5.0 1.0000000 Medium 0 1
## 3 5.0 1.3333333 Short 0 0
## 4 2.5 0.3333333 Medium 0 1
## 5 4.5 0.6666667 Short 0 0
## 6 1.5 2.0000000 Short 0 0
## 7 3.0 0.6666667 Short 0 0
## 8 2.0 0.6666667 Short 0 0
## 9 1.0 0.6666667 Short 0 0
## 10 4.0 0.6666667 Short 0 0
## 11 1.0 0.6666667 Short 0 0
## 12 1.0 1.0000000 Short 0 0
## 13 1.5 1.0000000 Short 0 0
## 14 5.0 1.0000000 Short 0 0
## 15 2.0 0.6666667 Short 0 0
## 16 4.0 0.6666667 Medium 0 1
## 17 1.5 0.6666667 Short 0 0
## 18 2.0 1.0000000 Short 0 0
## 19 4.5 0.6666667 Short 0 0
## 20 1.5 0.6666667 Short 0 0
## 21 2.0 0.6666667 Short 0 0
## 22 2.0 0.6666667 Medium 0 1
## 23 1.5 0.6666667 Short 0 0
## 24 3.0 0.6666667 Short 0 0
## 25 1.0 0.3333333 Short 0 0
## 26 3.5 1.6666667 Short 0 0
## 27 3.0 0.6666667 Medium 0 1
## 28 1.5 0.6666667 Long 1 0
## 29 1.0 0.6666667 Medium 0 1
## 30 2.5 0.6666667 Short 0 0
## 31 1.0 0.3333333 Short 0 0
## 32 1.0 1.0000000 Short 0 0
## 33 1.5 0.6666667 Short 0 0
## 34 3.0 0.6666667 Short 0 0
## 35 1.0 1.0000000 Short 0 0
## 36 1.0 0.6666667 Short 0 0
## 37 1.5 0.6666667 Short 0 0
## 38 1.0 1.0000000 Short 0 0
## 39 1.0 1.0000000 Long 1 0
## 40 1.5 0.6666667 Medium 0 1
## 41 4.0 1.0000000 Medium 0 1
## 42 4.5 2.3333333 Medium 0 1
## 43 1.0 0.6666667 Short 0 0
## 44 1.5 0.6666667 Short 0 0
## 45 1.5 0.6666667 Long 1 0
## 46 1.5 0.3333333 Short 0 0
## 47 1.0 0.6666667 Short 0 0
## 48 2.0 0.3333333 Short 0 0
## 49 1.5 0.6666667 Short 0 0
## 50 1.5 0.6666667 Long 1 0
## 51 2.0 1.0000000 Short 0 0
## 52 2.0 1.0000000 Short 0 0
## 53 1.0 0.6666667 Long 1 0
## 54 4.5 0.6666667 Short 0 0
## 55 2.0 0.6666667 Short 0 0
## 56 1.0 0.3333333 Short 0 0
## 57 4.0 0.6666667 Medium 0 1
## 58 1.0 1.3333333 Long 1 0
## 59 1.0 0.6666667 Short 0 0
## 60 2.0 0.6666667 Short 0 0
## 61 5.0 1.6666667 Long 1 0
## 62 2.0 0.6666667 Short 0 0
## 63 2.5 0.6666667 Short 0 0
## 64 1.0 0.6666667 Short 0 0
## 65 1.0 0.6666667 Short 0 0
## 66 1.0 1.0000000 Short 0 0
## 67 2.0 0.6666667 Short 0 0
## 68 2.0 1.6666667 Short 0 0
## 69 2.0 0.6666667 Short 0 0
## 70 3.0 0.6666667 Short 0 0
## 71 1.0 0.6666667 Medium 0 1
## 72 3.0 1.0000000 Medium 0 1
## 73 2.5 0.6666667 Short 0 0
## 74 4.0 1.0000000 Short 0 0
## 75 1.0 0.6666667 Short 0 0
## 76 1.0 0.6666667 Short 0 0
## 77 2.5 0.6666667 Long 1 0
## 78 2.0 0.6666667 Short 0 0
## 79 3.0 0.6666667 Short 0 0
## 80 1.0 0.6666667 Medium 0 1
## 81 5.0 0.6666667 Medium 0 1
## 82 1.0 1.0000000 Medium 0 1
## 83 1.0 0.3333333 Medium 0 1
## 84 1.0 0.6666667 Long 1 0
## 85 1.0 0.6666667 Short 0 0
## 86 2.0 0.6666667 Long 1 0
## 87 4.0 1.0000000 Short 0 0
## 88 1.5 0.6666667 Short 0 0
## 89 5.0 0.6666667 Short 0 0
## 90 5.0 0.6666667 Short 0 0
## 91 3.5 0.3333333 Short 0 0
## 92 1.5 1.3333333 Long 1 0
## 93 5.0 1.6666667 Short 0 0
## 94 5.0 0.6666667 Short 0 0
## 95 1.5 1.0000000 Short 0 0
## 96 5.0 1.6666667 Medium 0 1
## 97 1.0 1.0000000 Short 0 0
## 98 1.5 0.6666667 Short 0 0
## 99 1.5 0.6666667 Short 0 0
## 100 4.5 0.6666667 Medium 0 1
## 101 3.5 0.6666667 Short 0 0
## 102 1.5 1.3333333 Short 0 0
## 103 1.5 0.6666667 Short 0 0
## 104 1.0 0.6666667 Short 0 0
## 105 1.0 0.6666667 Medium 0 1
## 106 2.0 0.6666667 Short 0 0
## 107 4.5 1.0000000 Medium 0 1
## 108 1.5 0.6666667 Short 0 0
## 109 1.0 0.6666667 Medium 0 1
## 110 1.0 0.3333333 Short 0 0
## 111 2.0 0.6666667 Short 0 0
## 112 2.5 0.6666667 Short 0 0
## 113 1.0 1.0000000 Medium 0 1
## 114 2.0 0.6666667 Medium 0 1
## 115 5.0 1.6666667 Long 1 0
## 116 5.0 0.6666667 Short 0 0
## 117 1.5 0.6666667 Medium 0 1
## 118 4.5 0.6666667 Short 0 0
## 119 1.5 0.6666667 Medium 0 1
## 120 3.5 1.3333333 Medium 0 1
## 121 4.5 0.6666667 Long 1 0
## 122 1.0 1.0000000 Medium 0 1
## 123 5.0 1.6666667 Long 1 0
## 124 2.0 0.6666667 Short 0 0
## 125 4.0 0.6666667 Medium 0 1
## 126 1.0 0.3333333 Long 1 0
## 127 1.0 1.0000000 Short 0 0
## 128 1.0 1.0000000 Short 0 0
## 129 1.0 0.6666667 Long 1 0
## 130 1.0 0.6666667 Short 0 0
## 131 2.0 0.6666667 Long 1 0
## 132 1.0 0.3333333 Short 0 0
## 133 4.0 1.6666667 Short 0 0
## 134 3.0 0.6666667 Medium 0 1
## 135 1.5 0.3333333 Short 0 0
## 136 2.0 0.6666667 Short 0 0
## 137 5.0 1.3333333 Long 1 0
## 138 3.5 0.6666667 Short 0 0
## 139 1.0 1.0000000 Medium 0 1
## 140 1.0 0.6666667 Medium 0 1
## 141 1.5 1.0000000 Medium 0 1
## 142 1.0 0.6666667 Short 0 0
## 143 1.0 0.6666667 Short 0 0
## 144 2.0 0.6666667 Short 0 0
## 145 3.0 0.6666667 Long 1 0
## 146 2.0 0.3333333 Long 1 0
## 147 2.0 0.6666667 Short 0 0
## 148 1.0 0.6666667 Medium 0 1
## 149 1.5 0.6666667 Short 0 0
## 150 5.0 1.6666667 Long 1 0
## 151 2.0 0.6666667 Long 1 0
## 152 2.0 1.3333333 Medium 0 1
## 153 1.0 1.0000000 Short 0 0
## 154 2.5 0.6666667 Short 0 0
## 155 1.0 0.6666667 Short 0 0
## 156 2.5 1.0000000 Medium 0 1
## 157 1.0 1.0000000 Long 1 0
## 158 1.0 0.6666667 Short 0 0
## 159 1.0 0.6666667 Medium 0 1
## 160 5.0 1.6666667 Long 1 0
## 161 1.5 1.0000000 Medium 0 1
## 162 2.5 0.6666667 Short 0 0
## 163 1.5 1.0000000 Short 0 0
## 164 1.0 0.6666667 Medium 0 1
## 165 3.5 0.6666667 Short 0 0
## 166 1.0 0.6666667 Short 0 0
## 167 4.5 0.6666667 Short 0 0
## 168 1.5 0.6666667 Short 0 0
## 169 3.0 0.6666667 Short 0 0
## 170 1.0 0.6666667 Short 0 0
## 171 2.0 0.6666667 Short 0 0
## 172 3.0 0.6666667 Short 0 0
## 173 2.0 0.6666667 Short 0 0
## 174 1.0 0.6666667 Short 0 0
## 175 1.5 0.6666667 Short 0 0
## 176 1.0 1.0000000 Medium 0 1
## 177 2.0 0.6666667 Long 1 0
## 178 5.0 0.6666667 Medium 0 1
## 179 1.0 0.6666667 Short 0 0
## 180 2.5 0.3333333 Short 0 0
## 181 1.0 1.3333333 Medium 0 1
## 182 1.0 0.3333333 Short 0 0
## 183 3.0 0.6666667 Short 0 0
## 184 5.0 0.6666667 Short 0 0
## 185 1.0 1.0000000 Short 0 0
## 186 4.0 0.6666667 Long 1 0
## 187 4.5 1.3333333 Short 0 0
## 188 2.0 0.3333333 Long 1 0
## 189 2.0 1.3333333 Short 0 0
## 190 1.0 0.6666667 Medium 0 1
## 191 1.0 0.6666667 Medium 0 1
## 192 1.0 0.6666667 Medium 0 1
## 193 1.0 1.0000000 Medium 0 1
## 194 4.0 1.0000000 Short 0 0
## 195 2.0 1.3333333 Medium 0 1
## 196 1.0 0.6666667 Medium 0 1
## 197 1.0 0.3333333 Short 0 0
## 198 1.0 1.0000000 Short 0 0
## 199 2.0 0.6666667 Medium 0 1
## 200 2.0 0.6666667 Short 0 0
## 201 4.0 0.6666667 Medium 0 1
## 202 3.0 0.6666667 Short 0 0
## 203 3.0 0.6666667 Medium 0 1
## 204 1.0 1.0000000 Medium 0 1
## 205 2.5 1.0000000 Short 0 0
## 206 1.0 0.6666667 Short 0 0
## 207 1.0 1.0000000 Short 0 0
## 208 3.5 1.3333333 Long 1 0
## 209 4.0 1.6666667 Long 1 0
## 210 1.5 0.3333333 Medium 0 1
## 211 1.0 0.6666667 Long 1 0
## 212 1.0 1.0000000 Short 0 0
## 213 3.0 0.6666667 Medium 0 1
## 214 2.0 1.3333333 Medium 0 1
## 215 1.0 1.0000000 Short 0 0
## 216 4.5 1.3333333 Short 0 0
## 217 1.0 0.6666667 Short 0 0
## 218 2.5 1.3333333 Medium 0 1
## 219 1.5 1.3333333 Short 0 0
## 220 1.5 1.0000000 Medium 0 1
## 221 1.5 1.0000000 Short 0 0
## 222 1.5 0.6666667 Short 0 0
## 223 2.0 1.6666667 Short 0 0
## 224 1.0 0.3333333 Short 0 0
## 225 4.5 1.3333333 Medium 0 1
## 226 1.5 1.0000000 Medium 0 1
## 227 4.0 1.0000000 Medium 0 1
## 228 1.0 1.0000000 Short 0 0
## 229 1.0 0.6666667 Medium 0 1
## 230 2.0 0.6666667 Medium 0 1
## 231 1.0 0.6666667 Long 1 0
## 232 3.0 0.6666667 Medium 0 1
## 233 1.0 1.0000000 Short 0 0
## 234 2.0 0.6666667 Medium 0 1
## 235 2.0 1.0000000 Medium 0 1
## 236 1.0 1.0000000 Short 0 0
## 237 1.5 0.6666667 Short 0 0
## 238 1.0 0.6666667 Medium 0 1
## 239 4.5 1.0000000 Long 1 0
## 240 1.5 0.6666667 Long 1 0
## 241 1.5 0.6666667 Short 0 0
## 242 3.0 0.6666667 Short 0 0
## 243 1.0 0.6666667 Medium 0 1
## 244 1.0 0.6666667 Short 0 0
## 245 3.0 0.6666667 Medium 0 1
## 246 1.5 0.3333333 Short 0 0
## 247 1.5 1.0000000 Medium 0 1
## 248 5.0 1.0000000 Short 0 0
## 249 5.0 1.6666667 Long 1 0
## 250 1.5 0.6666667 Short 0 0
## 251 2.0 0.6666667 Short 0 0
## 252 1.0 0.6666667 Short 0 0
## 253 2.0 0.6666667 Short 0 0
## 254 2.0 0.6666667 Long 1 0
## 255 1.0 1.0000000 Short 0 0
## 256 1.0 0.6666667 Medium 0 1
## 257 2.0 1.0000000 Short 0 0
## 258 5.0 1.0000000 Long 1 0
## 259 1.0 1.0000000 Short 0 0
## 260 1.0 0.6666667 Medium 0 1
## 261 3.0 1.6666667 Short 0 0
## 262 5.0 0.6666667 Medium 0 1
## 263 1.0 0.6666667 Short 0 0
## 264 2.0 0.6666667 Short 0 0
## 265 2.0 0.6666667 Short 0 0
## 266 1.5 0.6666667 Medium 0 1
## 267 1.0 0.6666667 Long 1 0
## 268 1.0 0.6666667 Short 0 0
## 269 2.0 0.6666667 Short 0 0
## 270 2.0 0.6666667 Short 0 0
## 271 2.0 0.6666667 Short 0 0
## 272 3.0 0.6666667 Short 0 0
## 273 1.0 0.6666667 Short 0 0
## 274 1.0 0.6666667 Short 0 0
## 275 1.0 0.6666667 Medium 0 1
## 276 1.0 1.0000000 Short 0 0
## 277 5.0 0.6666667 Short 0 0
## 278 1.0 0.3333333 Short 0 0
## 279 5.0 0.6666667 Short 0 0
## 280 2.0 0.6666667 Long 1 0
## 281 1.0 1.0000000 Short 0 0
## 282 2.0 1.0000000 Short 0 0
## 283 1.0 1.3333333 Medium 0 1
## 284 2.0 0.6666667 Long 1 0
## 285 2.0 0.6666667 Medium 0 1
## 286 2.0 1.3333333 Long 1 0
## 287 2.0 0.6666667 Short 0 0
## 288 1.0 0.3333333 Short 0 0
## 289 1.0 1.0000000 Medium 0 1
## 290 1.5 0.6666667 Short 0 0
## 291 1.0 0.6666667 Short 0 0
## 292 3.0 0.6666667 Short 0 0
## 293 3.0 0.6666667 Short 0 0
## 294 2.5 0.6666667 Short 0 0
## 295 2.0 0.6666667 Long 1 0
## 296 2.0 0.6666667 Short 0 0
## 297 4.5 1.0000000 Short 0 0
## 298 4.0 0.6666667 Short 0 0
## 299 1.0 0.6666667 Short 0 0
## 300 1.0 0.6666667 Long 1 0
## 301 3.5 0.6666667 Short 0 0
## 302 1.0 1.0000000 Medium 0 1
## 303 5.0 0.6666667 Short 0 0
## 304 2.0 0.6666667 Medium 0 1
## 305 2.0 0.6666667 Long 1 0
## 306 2.0 0.6666667 Medium 0 1
## 307 2.0 0.6666667 Short 0 0
## 308 2.0 0.6666667 Short 0 0
## 309 4.0 1.0000000 Short 0 0
## 310 1.0 0.6666667 Medium 0 1
## 311 1.0 0.6666667 Short 0 0
## 312 2.0 0.6666667 Medium 0 1
## 313 2.0 0.6666667 Short 0 0
## 314 5.0 0.6666667 Medium 0 1
## 315 5.0 0.6666667 Medium 0 1
## 316 2.0 0.6666667 Short 0 0
## 317 2.0 0.6666667 Short 0 0
## 318 3.0 1.0000000 Short 0 0
## 319 1.5 0.6666667 Medium 0 1
## 320 2.0 0.6666667 Long 1 0
## 321 4.5 1.3333333 Long 1 0
## 322 1.0 1.0000000 Medium 0 1
## 323 2.0 0.6666667 Short 0 0
## 324 2.0 0.6666667 Short 0 0
## 325 2.0 0.6666667 Medium 0 1
## 326 2.0 0.6666667 Medium 0 1
## 327 3.0 0.6666667 Medium 0 1
## 328 2.0 0.6666667 Medium 0 1
## 329 5.0 0.6666667 Short 0 0
## 330 2.0 0.6666667 Medium 0 1
## 331 1.0 0.6666667 Short 0 0
## 332 1.5 0.6666667 Short 0 0
## 333 5.0 1.0000000 Short 0 0
## 334 2.0 0.6666667 Medium 0 1
## 335 2.0 0.6666667 Short 0 0
## 336 4.5 0.6666667 Medium 0 1
## 337 5.0 0.6666667 Long 1 0
## 338 3.5 2.6666667 Short 0 0
## 339 5.0 0.6666667 Short 0 0
## 340 2.0 0.6666667 Medium 0 1
## 341 2.0 0.6666667 Short 0 0
## 342 2.0 0.6666667 Short 0 0
## 343 2.0 0.6666667 Medium 0 1
## 344 2.0 0.6666667 Short 0 0
## 345 2.0 0.6666667 Short 0 0
## 346 2.0 0.6666667 Short 0 0
## 347 2.0 0.6666667 Short 0 0
## 348 2.0 0.6666667 Short 0 0
## 349 1.0 0.3333333 Short 0 0
## 350 3.5 1.0000000 Short 0 0
## 351 2.0 0.6666667 Short 0 0
## 352 2.0 0.6666667 Short 0 0
## 353 3.0 0.6666667 Medium 0 1
## 354 2.0 0.6666667 Short 0 0
## 355 3.0 0.6666667 Medium 0 1
## 356 4.5 1.0000000 Long 1 0
## 357 2.0 0.6666667 Short 0 0
## 358 2.0 0.6666667 Medium 0 1
## 359 2.0 0.6666667 Short 0 0
## 360 4.0 0.6666667 Short 0 0
## 361 2.0 0.6666667 Short 0 0
## 362 1.0 0.3333333 Short 0 0
## 363 1.0 0.6666667 Medium 0 1
## 364 1.5 0.3333333 Short 0 0
## 365 1.0 0.6666667 Short 0 0
## 366 4.5 0.6666667 Short 0 0
## 367 1.0 0.6666667 Short 0 0
## 368 1.0 0.6666667 Medium 0 1
## 369 1.0 1.0000000 Short 0 0
## 370 5.0 0.6666667 Medium 0 1
## 371 2.0 0.6666667 Short 0 0
## 372 2.0 0.6666667 Short 0 0
## 373 4.5 1.6666667 Medium 0 1
## 374 1.0 0.3333333 Short 0 0
## 375 2.0 0.6666667 Short 0 0
## 376 1.0 1.0000000 Medium 0 1
## 377 1.0 0.6666667 Medium 0 1
## 378 1.0 0.6666667 Short 0 0
## 379 5.0 0.6666667 Medium 0 1
## 380 4.5 0.6666667 Long 1 0
## 381 2.5 0.6666667 Short 0 0
## 382 5.0 0.6666667 Short 0 0
## 383 1.0 1.0000000 Long 1 0
## 384 4.5 1.0000000 Short 0 0
## 385 1.0 1.0000000 Short 0 0
## 386 2.0 0.3333333 Short 0 0
## 387 1.5 0.6666667 Short 0 0
## 388 3.5 0.6666667 Medium 0 1
## 389 1.0 0.6666667 Short 0 0
## 390 4.5 1.0000000 Short 0 0
## 391 1.5 0.6666667 Medium 0 1
## 392 1.0 1.0000000 Medium 0 1
## 393 1.0 1.3333333 Medium 0 1
## 394 2.0 1.3333333 Long 1 0
## 395 1.0 1.0000000 Medium 0 1
## 396 5.0 0.6666667 Medium 0 1
## 397 2.0 0.6666667 Long 1 0
## 398 5.0 0.6666667 Short 0 0
## 399 1.5 0.3333333 Short 0 0
## 400 2.5 0.6666667 Short 0 0
## 401 2.0 0.6666667 Short 0 0
## 402 2.0 0.6666667 Short 0 0
## 403 3.0 0.6666667 Short 0 0
## 404 1.0 0.6666667 Short 0 0
## 405 1.0 1.0000000 Long 1 0
## 406 1.0 0.6666667 Short 0 0
## 407 2.0 0.6666667 Short 0 0
## 408 1.5 0.6666667 Short 0 0
## 409 1.0 0.6666667 Short 0 0
## 410 1.5 0.6666667 Short 0 0
## 411 2.0 0.6666667 Medium 0 1
## 412 2.5 1.0000000 Short 0 0
## 413 1.0 0.6666667 Short 0 0
## 414 2.0 1.0000000 Short 0 0
## 415 1.0 1.0000000 Short 0 0
## 416 2.5 1.0000000 Short 0 0
## 417 1.0 1.0000000 Short 0 0
## 418 3.5 0.6666667 Short 0 0
## 419 2.0 0.6666667 Short 0 0
## 420 2.5 0.6666667 Short 0 0
## 421 2.0 0.6666667 Short 0 0
## 422 1.0 0.6666667 Short 0 0
## 423 5.0 0.6666667 Medium 0 1
## 424 2.0 0.6666667 Short 0 0
## 425 1.5 0.6666667 Medium 0 1
## 426 2.5 2.0000000 Medium 0 1
## 427 4.0 0.6666667 Medium 0 1
## 428 4.0 1.3333333 Medium 0 1
## 429 2.5 0.6666667 Short 0 0
## 430 2.0 0.6666667 Short 0 0
## 431 1.0 0.6666667 Short 0 0
## 432 2.0 0.6666667 Short 0 0
## 433 1.0 0.6666667 Medium 0 1
## 434 1.0 0.6666667 Long 1 0
## 435 1.0 0.6666667 Short 0 0
## 436 2.5 0.6666667 Medium 0 1
## 437 3.5 1.0000000 Medium 0 1
## 438 1.0 0.6666667 Short 0 0
## 439 1.0 1.0000000 Short 0 0
## 440 1.0 0.6666667 Short 0 0
## 441 1.0 0.6666667 Short 0 0
## 442 2.0 0.6666667 Medium 0 1
## 443 2.0 0.6666667 Short 0 0
## 444 1.5 0.6666667 Short 0 0
## 445 1.0 1.0000000 Short 0 0
## 446 1.0 1.0000000 Short 0 0
## 447 2.5 0.3333333 Medium 0 1
## 448 1.0 0.6666667 Short 0 0
## 449 1.0 1.0000000 Short 0 0
## 450 1.0 0.3333333 Medium 0 1
## 451 2.0 0.6666667 Medium 0 1
## 452 1.0 0.6666667 Long 1 0
## 453 5.0 0.6666667 Short 0 0
## 454 2.5 1.3333333 Medium 0 1
## 455 1.5 0.6666667 Short 0 0
## 456 2.0 0.6666667 Short 0 0
## 457 1.0 1.0000000 Short 0 0
## 458 4.0 0.6666667 Medium 0 1
## 459 2.5 0.6666667 Short 0 0
## 460 2.0 0.6666667 Short 0 0
## 461 2.0 0.6666667 Short 0 0
## 462 1.5 0.3333333 Short 0 0
## 463 1.0 0.3333333 Short 0 0
## 464 2.0 0.6666667 Long 1 0
## 465 2.0 0.6666667 Short 0 0
## 466 3.0 1.6666667 Medium 0 1
## 467 3.0 0.6666667 Medium 0 1
## 468 1.0 0.6666667 Medium 0 1
## 469 2.0 0.6666667 Short 0 0
## 470 3.0 0.6666667 Short 0 0
## 471 2.5 1.0000000 Short 0 0
## 472 4.0 2.3333333 Medium 0 1
## 473 1.5 0.6666667 Medium 0 1
## 474 2.0 0.6666667 Short 0 0
## 475 1.0 0.6666667 Medium 0 1
## 476 1.5 0.6666667 Short 0 0
## 477 5.0 1.6666667 Short 0 0
## 478 1.0 0.6666667 Short 0 0
## 479 1.0 1.0000000 Short 0 0
## 480 2.0 0.6666667 Long 1 0
## 481 1.5 0.6666667 Short 0 0
## 482 1.0 0.6666667 Short 0 0
## 483 1.0 0.6666667 Short 0 0
## 484 1.0 1.0000000 Short 0 0
## 485 1.0 0.3333333 Medium 0 1
## 486 1.0 1.0000000 Short 0 0
## 487 1.0 1.0000000 Short 0 0
## 488 1.0 1.0000000 Short 0 0
## 489 1.5 0.6666667 Short 0 0
## 490 2.0 0.6666667 Short 0 0
## 491 1.0 1.0000000 Short 0 0
## 492 1.0 0.6666667 Medium 0 1
## 493 1.0 0.6666667 Medium 0 1
## 494 1.0 0.6666667 Short 0 0
## 495 1.5 1.0000000 Short 0 0
## 496 1.0 1.0000000 Medium 0 1
## 497 2.0 0.6666667 Short 0 0
## 498 1.0 0.6666667 Short 0 0
## 499 1.0 0.6666667 Short 0 0
## 500 2.0 0.6666667 Short 0 0
## 501 2.0 0.6666667 Short 0 0
## 502 1.0 0.6666667 Long 1 0
## 503 3.0 0.6666667 Long 1 0
## 504 1.5 0.6666667 Short 0 0
## 505 2.0 0.6666667 Short 0 0
## 506 1.5 1.3333333 Short 0 0
## 507 2.0 0.6666667 Medium 0 1
## 508 5.0 5.0000000 Medium 0 1
## 509 1.0 0.3333333 Medium 0 1
## 510 1.0 0.6666667 Short 0 0
## 511 1.5 1.0000000 Medium 0 1
## 512 1.0 1.0000000 Medium 0 1
## 513 3.0 0.6666667 Short 0 0
## 514 3.0 0.6666667 Short 0 0
## 515 4.5 0.6666667 Medium 0 1
## 516 1.0 1.0000000 Short 0 0
## 517 5.0 1.6666667 Short 0 0
## 518 1.0 1.0000000 Short 0 0
## 519 1.0 0.6666667 Short 0 0
## 520 2.5 0.6666667 Short 0 0
## 521 2.0 1.0000000 Short 0 0
## 522 4.5 0.6666667 Short 0 0
## 523 1.0 0.6666667 Short 0 0
## 524 1.0 1.0000000 Short 0 0
## 525 2.0 1.3333333 Short 0 0
## 526 5.0 0.6666667 Medium 0 1
## 527 1.0 0.3333333 Medium 0 1
## 528 1.0 0.6666667 Medium 0 1
## 529 2.0 0.6666667 Short 0 0
## 530 2.0 0.6666667 Medium 0 1
## 531 1.0 0.6666667 Medium 0 1
## 532 3.0 2.0000000 Short 0 0
## 533 1.0 0.6666667 Short 0 0
## 534 2.0 0.6666667 Short 0 0
## 535 1.5 0.6666667 Short 0 0
## 536 1.0 0.6666667 Short 0 0
## 537 1.0 0.6666667 Short 0 0
## 538 1.0 0.3333333 Long 1 0
## 539 1.5 1.0000000 Short 0 0
## 540 1.0 1.3333333 Long 1 0
## 541 1.0 1.0000000 Short 0 0
## 542 2.0 0.6666667 Short 0 0
## 543 2.0 0.6666667 Short 0 0
## 544 1.0 0.6666667 Long 1 0
## 545 1.0 1.0000000 Medium 0 1
## 546 1.0 1.3333333 Long 1 0
## 547 1.0 0.6666667 Short 0 0
## 548 3.5 0.6666667 Short 0 0
## 549 1.0 1.0000000 Medium 0 1
## 550 1.5 0.6666667 Short 0 0
## 551 1.0 0.6666667 Medium 0 1
## 552 1.0 0.6666667 Long 1 0
## 553 3.0 1.0000000 Short 0 0
## 554 2.0 1.0000000 Medium 0 1
## 555 1.0 0.6666667 Short 0 0
## 556 1.5 0.6666667 Short 0 0
## 557 4.0 2.6666667 Short 0 0
## 558 2.0 0.6666667 Short 0 0
## 559 1.0 0.3333333 Short 0 0
## 560 1.5 0.6666667 Short 0 0
## 561 1.0 0.6666667 Medium 0 1
## 562 2.0 0.6666667 Short 0 0
## 563 2.0 0.6666667 Short 0 0
## 564 3.5 0.6666667 Long 1 0
## 565 2.0 0.6666667 Short 0 0
## 566 2.0 0.3333333 Medium 0 1
## 567 1.0 1.0000000 Medium 0 1
## 568 1.5 0.6666667 Medium 0 1
## 569 2.0 0.6666667 Short 0 0
## 570 1.0 0.6666667 Medium 0 1
## 571 1.5 0.6666667 Short 0 0
## 572 1.0 0.3333333 Short 0 0
## 573 2.5 1.0000000 Medium 0 1
## 574 1.0 0.3333333 Medium 0 1
## 575 2.0 0.6666667 Short 0 0
## 576 1.0 0.6666667 Medium 0 1
## 577 1.0 1.0000000 Long 1 0
## 578 1.5 0.6666667 Medium 0 1
## 579 1.0 0.6666667 Medium 0 1
## 580 4.5 0.6666667 Short 0 0
## 581 1.0 0.6666667 Medium 0 1
## 582 1.5 0.6666667 Short 0 0
## 583 5.0 1.0000000 Short 0 0
## 584 3.5 0.6666667 Short 0 0
## 585 1.0 1.0000000 Short 0 0
## 586 5.0 1.0000000 Medium 0 1
## 587 3.0 1.6666667 Medium 0 1
## 588 1.5 0.6666667 Short 0 0
## 589 2.0 1.0000000 Long 1 0
## 590 2.5 1.0000000 Short 0 0
## 591 4.0 0.6666667 Short 0 0
## 592 4.5 0.6666667 Short 0 0
## 593 2.5 0.6666667 Short 0 0
## 594 2.0 0.6666667 Short 0 0
## 595 4.5 0.6666667 Short 0 0
## 596 1.0 0.6666667 Long 1 0
## 597 1.0 0.6666667 Short 0 0
## 598 1.5 1.0000000 Short 0 0
## 599 1.0 0.3333333 Long 1 0
## 600 4.0 0.6666667 Short 0 0
## 601 1.0 0.6666667 Medium 0 1
## 602 2.0 1.0000000 Short 0 0
## 603 1.0 0.3333333 Medium 0 1
## 604 1.0 1.0000000 Short 0 0
## 605 1.0 1.3333333 Short 0 0
## 606 2.0 0.3333333 Short 0 0
## 607 1.0 0.6666667 Medium 0 1
## 608 4.0 0.6666667 Short 0 0
## 609 4.5 0.6666667 Short 0 0
## 610 3.5 0.3333333 Medium 0 1
## 611 2.0 0.6666667 Short 0 0
## 612 1.0 0.6666667 Short 0 0
## 613 3.0 0.3333333 Short 0 0
## 614 1.0 0.6666667 Short 0 0
## 615 1.0 0.3333333 Short 0 0
## 616 1.0 1.0000000 Medium 0 1
## 617 1.0 0.6666667 Short 0 0
## 618 1.0 1.0000000 Short 0 0
## 619 2.0 0.6666667 Short 0 0
## 620 2.0 0.6666667 Short 0 0
## 621 1.0 0.3333333 Long 1 0
## 622 4.5 1.0000000 Short 0 0
## 623 1.0 0.6666667 Short 0 0
## 624 2.0 1.0000000 Short 0 0
## 625 1.5 0.6666667 Short 0 0
## 626 2.0 0.6666667 Medium 0 1
## 627 1.0 0.6666667 Short 0 0
## 628 1.0 0.6666667 Medium 0 1
## 629 3.0 1.3333333 Short 0 0
## 630 5.0 1.3333333 Short 0 0
## 631 4.5 0.6666667 Medium 0 1
## 632 3.5 0.6666667 Long 1 0
## 633 5.0 1.6666667 Short 0 0
## 634 2.0 1.0000000 Short 0 0
## 635 1.0 0.6666667 Long 1 0
## 636 1.5 0.6666667 Short 0 0
## 637 3.5 0.6666667 Short 0 0
## 638 2.0 0.6666667 Short 0 0
## 639 1.5 0.6666667 Short 0 0
## 640 2.0 0.6666667 Short 0 0
## 641 3.5 1.0000000 Medium 0 1
## 642 3.0 0.6666667 Short 0 0
## 643 1.0 0.6666667 Medium 0 1
## 644 2.5 1.3333333 Short 0 0
## 645 2.0 1.0000000 Medium 0 1
## 646 2.5 1.0000000 Short 0 0
## 647 1.5 0.6666667 Short 0 0
## 648 1.5 1.0000000 Medium 0 1
## 649 1.5 0.3333333 Short 0 0
## 650 1.0 0.6666667 Medium 0 1
## 651 1.0 0.6666667 Medium 0 1
## 652 3.5 0.6666667 Short 0 0
## 653 2.0 0.3333333 Medium 0 1
## 654 4.0 0.6666667 Short 0 0
## 655 4.0 0.6666667 Short 0 0
## 656 1.0 0.6666667 Medium 0 1
## 657 1.0 0.6666667 Long 1 0
## 658 4.5 1.0000000 Medium 0 1
## 659 1.5 0.6666667 Medium 0 1
## 660 4.0 0.6666667 Short 0 0
## 661 2.5 1.3333333 Short 0 0
## 662 1.0 1.0000000 Long 1 0
## 663 1.5 0.3333333 Short 0 0
## 664 1.0 0.6666667 Medium 0 1
## 665 2.0 0.6666667 Medium 0 1
## 666 1.5 0.3333333 Medium 0 1
## 667 1.0 0.3333333 Medium 0 1
## 668 1.5 0.3333333 Short 0 0
## 669 3.0 0.6666667 Short 0 0
## 670 4.0 0.6666667 Medium 0 1
## 671 1.0 0.6666667 Short 0 0
## 672 1.0 0.6666667 Short 0 0
## 673 2.0 0.6666667 Medium 0 1
## 674 1.0 1.0000000 Long 1 0
## 675 5.0 0.6666667 Short 0 0
## 676 1.5 0.6666667 Medium 0 1
## 677 2.0 0.3333333 Long 1 0
## 678 3.5 4.0000000 Short 0 0
## 679 1.0 1.0000000 Short 0 0
## 680 1.0 1.0000000 Short 0 0
## 681 2.0 0.6666667 Short 0 0
## 682 1.0 0.6666667 Medium 0 1
## 683 2.0 0.6666667 Short 0 0
## 684 3.0 2.3333333 Long 1 0
## 685 2.0 0.6666667 Medium 0 1
## 686 1.0 0.6666667 Long 1 0
## 687 1.0 0.3333333 Short 0 0
## 688 1.0 0.6666667 Long 1 0
## 689 2.0 1.3333333 Long 1 0
## 690 4.0 1.0000000 Short 0 0
## 691 3.5 0.6666667 Short 0 0
## 692 2.5 0.6666667 Medium 0 1
## 693 1.0 0.6666667 Medium 0 1
## 694 2.0 0.6666667 Short 0 0
## 695 1.5 1.0000000 Short 0 0
## 696 1.0 0.6666667 Short 0 0
## 697 1.0 0.6666667 Short 0 0
## 698 2.0 1.3333333 Short 0 0
## 699 5.0 0.6666667 Short 0 0
## 700 1.0 0.6666667 Short 0 0
## 701 2.5 0.6666667 Short 0 0
## 702 1.0 1.3333333 Short 0 0
## 703 1.0 0.6666667 Short 0 0
## 704 2.0 0.6666667 Short 0 0
## 705 1.5 0.6666667 Short 0 0
## 706 1.0 0.6666667 Medium 0 1
## 707 1.0 1.0000000 Long 1 0
## 708 5.0 0.6666667 Short 0 0
## 709 1.5 1.0000000 Short 0 0
## 710 1.0 0.3333333 Short 0 0
## 711 5.0 0.6666667 Short 0 0
## 712 4.5 0.6666667 Medium 0 1
## 713 1.0 0.6666667 Short 0 0
## 714 1.0 0.6666667 Medium 0 1
## 715 1.0 0.6666667 Short 0 0
## 716 3.0 1.0000000 Medium 0 1
## 717 2.0 1.0000000 Medium 0 1
## 718 5.0 1.6666667 Long 1 0
## 719 3.5 1.3333333 Short 0 0
## 720 2.0 0.6666667 Medium 0 1
## 721 5.0 0.6666667 Short 0 0
## 722 2.5 0.6666667 Short 0 0
## 723 5.0 0.6666667 Short 0 0
## 724 1.5 0.6666667 Long 1 0
## 725 1.5 0.6666667 Short 0 0
## 726 1.0 1.0000000 Short 0 0
## 727 2.0 0.3333333 Short 0 0
## 728 4.0 0.6666667 Medium 0 1
## 729 5.0 1.6666667 Short 0 0
## 730 2.0 2.0000000 Short 0 0
## 731 5.0 1.6666667 Medium 0 1
## 732 4.0 0.6666667 Short 0 0
## 733 4.0 1.0000000 Medium 0 1
## 734 2.5 0.3333333 Medium 0 1
## 735 1.5 1.0000000 Short 0 0
## 736 2.5 0.6666667 Long 1 0
## 737 5.0 0.6666667 Short 0 0
## 738 4.5 0.6666667 Short 0 0
## 739 2.0 1.0000000 Short 0 0
## 740 2.0 0.6666667 Medium 0 1
## 741 1.0 0.6666667 Long 1 0
## 742 1.5 1.0000000 Short 0 0
## 743 3.5 0.6666667 Long 1 0
## 744 1.0 0.6666667 Short 0 0
## 745 1.0 0.6666667 Medium 0 1
## 746 1.0 0.6666667 Long 1 0
## 747 3.0 1.3333333 Short 0 0
## 748 1.0 1.0000000 Short 0 0
## 749 4.0 0.6666667 Short 0 0
## 750 4.5 1.3333333 Short 0 0
## 751 1.0 1.0000000 Medium 0 1
## 752 1.0 0.6666667 Short 0 0
## 753 2.0 1.3333333 Long 1 0
## 754 3.5 0.6666667 Short 0 0
## 755 2.0 2.0000000 Short 0 0
## 756 1.0 1.0000000 Short 0 0
## 757 1.0 0.6666667 Short 0 0
## 758 2.0 0.6666667 Short 0 0
## 759 1.0 0.6666667 Short 0 0
## 760 1.5 1.0000000 Short 0 0
## 761 1.0 1.0000000 Medium 0 1
## 762 1.0 1.3333333 Medium 0 1
## 763 2.0 0.6666667 Short 0 0
## 764 1.0 0.6666667 Short 0 0
## 765 1.0 0.6666667 Short 0 0
## 766 1.5 1.0000000 Short 0 0
## 767 2.5 0.6666667 Long 1 0
## 768 1.0 0.6666667 Long 1 0
## 769 1.5 0.6666667 Short 0 0
## 770 1.5 1.0000000 Medium 0 1
## 771 1.0 1.0000000 Medium 0 1
## 772 2.0 0.6666667 Short 0 0
## 773 2.5 2.0000000 Medium 0 1
## 774 2.0 0.6666667 Short 0 0
## 775 1.5 0.6666667 Short 0 0
## 776 1.5 0.6666667 Medium 0 1
## 777 2.0 0.6666667 Short 0 0
## 778 4.0 1.6666667 Medium 0 1
## 779 2.0 0.6666667 Short 0 0
## 780 2.5 0.6666667 Short 0 0
## 781 4.5 0.6666667 Short 0 0
## 782 2.0 0.3333333 Short 0 0
## 783 2.0 1.0000000 Short 0 0
## 784 3.0 0.6666667 Short 0 0
## 785 1.0 0.6666667 Short 0 0
## 786 1.0 1.0000000 Medium 0 1
## 787 1.5 0.6666667 Short 0 0
## 788 2.0 0.6666667 Short 0 0
## 789 1.0 0.6666667 Long 1 0
## 790 4.0 0.3333333 Medium 0 1
## 791 1.5 0.6666667 Short 0 0
## 792 1.0 1.0000000 Medium 0 1
## 793 1.5 1.0000000 Short 0 0
## 794 5.0 0.6666667 Medium 0 1
## 795 2.0 0.3333333 Short 0 0
## 796 4.0 1.0000000 Long 1 0
## 797 2.0 0.6666667 Short 0 0
## 798 3.5 1.3333333 Medium 0 1
## 799 1.0 0.6666667 Short 0 0
## 800 3.5 1.6666667 Medium 0 1
## 801 3.0 1.3333333 Short 0 0
## 802 1.0 1.0000000 Short 0 0
## 803 1.0 0.6666667 Short 0 0
## 804 1.0 1.0000000 Long 1 0
## 805 1.0 0.6666667 Short 0 0
## 806 1.0 1.0000000 Short 0 0
## 807 1.5 1.0000000 Short 0 0
## 808 3.0 1.0000000 Short 0 0
## 809 1.0 1.0000000 Medium 0 1
## 810 1.0 0.6666667 Long 1 0
## 811 1.0 0.6666667 Short 0 0
## 812 4.5 1.3333333 Medium 0 1
## 813 3.5 0.6666667 Long 1 0
## 814 5.0 1.0000000 Medium 0 1
## 815 2.0 1.0000000 Short 0 0
## 816 3.5 0.6666667 Short 0 0
## 817 1.5 0.3333333 Short 0 0
## 818 3.0 1.0000000 Short 0 0
## 819 5.0 1.6666667 Medium 0 1
## 820 1.5 1.0000000 Medium 0 1
## 821 2.5 0.6666667 Medium 0 1
## 822 1.0 0.6666667 Long 1 0
## 823 2.5 1.0000000 Medium 0 1
## 824 1.0 0.6666667 Short 0 0
## 825 1.5 0.6666667 Medium 0 1
## 826 2.0 0.6666667 Short 0 0
## 827 2.0 1.3333333 Short 0 0
## 828 3.5 0.6666667 Short 0 0
## 829 1.0 1.0000000 Short 0 0
## 830 4.5 1.3333333 Long 1 0
## 831 2.0 1.0000000 Short 0 0
## 832 1.0 0.6666667 Long 1 0
## 833 1.0 0.6666667 Short 0 0
## 834 1.0 0.6666667 Short 0 0
## 835 1.0 1.0000000 Medium 0 1
## 836 2.0 0.6666667 Short 0 0
## 837 1.0 0.6666667 Short 0 0
## 838 4.0 1.3333333 Short 0 0
## 839 1.0 0.6666667 Medium 0 1
## 840 1.0 1.0000000 Medium 0 1
## 841 1.0 0.6666667 Medium 0 1
## 842 5.0 0.6666667 Short 0 0
## 843 4.0 0.6666667 Short 0 0
## 844 3.5 1.3333333 Short 0 0
## 845 4.0 0.6666667 Long 1 0
## 846 1.0 0.6666667 Medium 0 1
## 847 1.5 0.6666667 Short 0 0
## 848 1.0 0.6666667 Short 0 0
## 849 2.0 0.6666667 Medium 0 1
## 850 2.5 0.6666667 Short 0 0
## 851 1.0 0.6666667 Long 1 0
## 852 4.5 0.6666667 Short 0 0
## 853 1.0 0.3333333 Short 0 0
## 854 3.5 2.3333333 Short 0 0
## 855 1.5 0.3333333 Short 0 0
## 856 1.0 0.6666667 Short 0 0
## 857 1.0 0.3333333 Medium 0 1
## 858 2.0 0.6666667 Short 0 0
## 859 2.5 0.3333333 Short 0 0
## 860 1.0 0.6666667 Long 1 0
## 861 2.0 0.3333333 Short 0 0
## 862 1.0 1.0000000 Short 0 0
## 863 1.0 1.0000000 Short 0 0
## 864 2.0 0.6666667 Short 0 0
## 865 1.0 0.3333333 Short 0 0
## 866 1.5 0.6666667 Medium 0 1
## 867 4.5 0.6666667 Medium 0 1
## 868 2.5 1.0000000 Medium 0 1
## 869 2.5 0.6666667 Long 1 0
## 870 3.0 0.6666667 Long 1 0
## 871 1.0 0.6666667 Short 0 0
## 872 1.0 0.6666667 Short 0 0
## 873 2.5 0.6666667 Medium 0 1
## 874 2.0 0.6666667 Short 0 0
## 875 1.0 1.0000000 Short 0 0
## 876 1.0 0.6666667 Long 1 0
## 877 1.0 0.3333333 Short 0 0
## 878 2.5 0.6666667 Short 0 0
## 879 1.0 1.0000000 Short 0 0
## 880 2.5 0.6666667 Long 1 0
## 881 1.0 0.6666667 Medium 0 1
## 882 2.0 0.6666667 Short 0 0
## 883 1.0 1.0000000 Short 0 0
## 884 1.0 0.3333333 Medium 0 1
## 885 1.0 0.6666667 Short 0 0
## 886 3.0 1.0000000 Short 0 0
## 887 1.0 0.6666667 Short 0 0
## 888 1.0 0.6666667 Short 0 0
## 889 1.0 0.6666667 Medium 0 1
## 890 5.0 0.6666667 Short 0 0
## 891 2.0 0.6666667 Short 0 0
## 892 1.0 1.0000000 Long 1 0
## 893 1.0 1.0000000 Medium 0 1
## 894 2.0 0.6666667 Medium 0 1
## 895 1.5 1.0000000 Short 0 0
## 896 2.5 1.0000000 Medium 0 1
## 897 1.5 0.6666667 Short 0 0
## 898 2.0 0.6666667 Short 0 0
## 899 1.0 0.6666667 Long 1 0
## 900 1.0 3.3333333 Long 1 0
## 901 2.0 0.6666667 Short 0 0
## 902 2.5 0.6666667 Short 0 0
## 903 2.0 1.0000000 Short 0 0
## 904 2.0 0.6666667 Medium 0 1
## 905 1.0 0.3333333 Medium 0 1
## 906 1.0 0.6666667 Short 0 0
## 907 1.0 1.0000000 Short 0 0
## 908 4.5 1.6666667 Short 0 0
## 909 4.5 1.3333333 Short 0 0
## 910 2.0 1.0000000 Short 0 0
## 911 3.0 0.6666667 Medium 0 1
## 912 1.0 1.0000000 Short 0 0
## 913 1.0 1.6666667 Short 0 0
## 914 2.5 1.3333333 Short 0 0
## 915 3.0 0.6666667 Medium 0 1
## 916 1.0 0.6666667 Short 0 0
## 917 1.0 0.6666667 Medium 0 1
## 918 2.0 0.6666667 Short 0 0
## 919 3.0 0.6666667 Medium 0 1
## 920 1.5 1.0000000 Short 0 0
## 921 4.0 0.6666667 Medium 0 1
## 922 1.0 0.3333333 Short 0 0
## 923 2.5 1.3333333 Short 0 0
## 924 1.0 1.0000000 Short 0 0
## 925 1.0 0.6666667 Short 0 0
## 926 2.0 0.3333333 Medium 0 1
## 927 1.0 0.6666667 Short 0 0
## 928 1.0 0.6666667 Short 0 0
## 929 3.0 0.6666667 Medium 0 1
## 930 1.0 0.3333333 Short 0 0
## 931 2.0 0.6666667 Short 0 0
## 932 1.0 0.6666667 Short 0 0
## 933 1.0 0.6666667 Short 0 0
## 934 1.0 0.6666667 Short 0 0
## 935 1.0 1.0000000 Short 0 0
## 936 1.0 0.6666667 Long 1 0
## 937 2.0 0.6666667 Short 0 0
## 938 1.0 0.6666667 Short 0 0
## 939 1.0 0.6666667 Short 0 0
## 940 1.0 0.6666667 Medium 0 1
## 941 1.0 0.6666667 Short 0 0
## 942 1.5 1.3333333 Short 0 0
## 943 1.0 0.6666667 Short 0 0
## 944 2.5 0.6666667 Short 0 0
## 945 1.5 0.6666667 Long 1 0
## 946 1.5 0.6666667 Short 0 0
## 947 1.5 1.0000000 Short 0 0
## 948 5.0 1.6666667 Short 0 0
## 949 3.5 0.6666667 Short 0 0
## 950 4.0 1.0000000 Short 0 0
## 951 5.0 1.6666667 Medium 0 1
## 952 1.5 0.3333333 Short 0 0
## 953 1.0 1.0000000 Medium 0 1
## 954 2.5 0.6666667 Long 1 0
## 955 1.5 0.6666667 Short 0 0
## 956 4.5 1.3333333 Short 0 0
## 957 5.0 1.3333333 Long 1 0
## 958 2.0 0.6666667 Medium 0 1
## 959 4.5 0.6666667 Medium 0 1
## 960 5.0 1.3333333 Medium 0 1
## 961 2.0 0.6666667 Short 0 0
## 962 4.0 0.6666667 Short 0 0
## 963 3.5 0.6666667 Short 0 0
## 964 2.0 1.0000000 Short 0 0
## 965 1.0 0.3333333 Short 0 0
## 966 1.0 0.6666667 Medium 0 1
## 967 4.5 0.6666667 Short 0 0
## 968 1.5 0.6666667 Short 0 0
## 969 1.0 0.6666667 Short 0 0
## 970 1.0 0.3333333 Long 1 0
## 971 4.5 1.0000000 Short 0 0
## 972 1.0 0.3333333 Short 0 0
## 973 2.0 0.6666667 Medium 0 1
## 974 2.0 1.0000000 Medium 0 1
## 975 3.0 0.6666667 Long 1 0
## 976 1.0 1.0000000 Short 0 0
## 977 2.0 0.6666667 Short 0 0
## 978 1.0 0.6666667 Short 0 0
## 979 2.0 0.6666667 Short 0 0
## 980 2.0 0.6666667 Short 0 0
## 981 2.0 0.6666667 Long 1 0
## 982 3.5 0.6666667 Short 0 0
## 983 2.0 0.6666667 Short 0 0
## 984 1.0 0.6666667 Short 0 0
## 985 5.0 0.6666667 Medium 0 1
## 986 1.5 0.6666667 Medium 0 1
## 987 1.0 0.6666667 Short 0 0
## 988 1.5 0.3333333 Short 0 0
## 989 2.0 0.6666667 Short 0 0
## 990 5.0 1.0000000 Long 1 0
## 991 2.0 0.6666667 Long 1 0
## 992 3.0 1.0000000 Short 0 0
## 993 4.5 1.0000000 Medium 0 1
## 994 4.5 1.3333333 Short 0 0
## 995 2.5 0.6666667 Medium 0 1
## 996 3.5 0.6666667 Medium 0 1
## 997 5.0 0.6666667 Short 0 0
## 998 2.0 1.0000000 Short 0 0
## 999 3.5 0.6666667 Medium 0 1
## 1000 1.5 0.6666667 Short 0 0
## 1001 3.0 0.6666667 Short 0 0
## 1002 1.0 1.0000000 Short 0 0
## 1003 2.0 0.6666667 Medium 0 1
## 1004 2.5 1.0000000 Long 1 0
## 1005 3.5 0.6666667 Long 1 0
## 1006 4.5 0.6666667 Long 1 0
## 1007 2.0 1.3333333 Short 0 0
## 1008 2.0 0.6666667 Medium 0 1
## 1009 4.0 1.3333333 Medium 0 1
## 1010 1.5 0.6666667 Long 1 0
## 1011 1.0 0.6666667 Short 0 0
## 1012 2.0 1.3333333 Short 0 0
## 1013 4.5 0.6666667 Short 0 0
## 1014 1.0 0.6666667 Short 0 0
## 1015 3.5 0.6666667 Short 0 0
## 1016 2.0 0.6666667 Short 0 0
## 1017 2.0 1.6666667 Medium 0 1
## 1018 1.0 0.6666667 Medium 0 1
## 1019 4.5 1.6666667 Short 0 0
## 1020 1.0 0.6666667 Medium 0 1
## 1021 2.0 0.6666667 Medium 0 1
## 1022 1.5 0.3333333 Short 0 0
## 1023 3.0 0.3333333 Medium 0 1
## 1024 1.0 0.6666667 Medium 0 1
## 1025 2.0 0.6666667 Short 0 0
## 1026 5.0 0.6666667 Short 0 0
## 1027 2.0 1.0000000 Medium 0 1
## 1028 3.0 1.3333333 Short 0 0
## 1029 4.0 0.6666667 Short 0 0
## 1030 2.5 0.6666667 Short 0 0
## 1031 2.0 0.6666667 Short 0 0
## 1032 3.0 0.6666667 Short 0 0
## 1033 1.0 1.0000000 Short 0 0
## 1034 2.0 0.6666667 Short 0 0
## 1035 3.0 0.6666667 Short 0 0
## 1036 2.5 0.6666667 Short 0 0
## 1037 2.5 0.6666667 Long 1 0
## 1038 3.5 1.3333333 Medium 0 1
## 1039 1.0 0.6666667 Long 1 0
## 1040 1.5 0.6666667 Short 0 0
## 1041 1.0 1.0000000 Short 0 0
## 1042 1.5 0.6666667 Short 0 0
## 1043 1.0 1.0000000 Short 0 0
## 1044 4.0 0.6666667 Medium 0 1
## 1045 2.5 0.6666667 Long 1 0
## 1046 1.5 0.6666667 Short 0 0
## 1047 1.5 1.0000000 Medium 0 1
## 1048 2.0 0.6666667 Medium 0 1
## 1049 1.5 0.6666667 Long 1 0
## 1050 1.0 1.0000000 Short 0 0
## 1051 1.0 0.6666667 Medium 0 1
## 1052 3.0 0.6666667 Short 0 0
## 1053 2.5 0.6666667 Short 0 0
## 1054 5.0 0.6666667 Short 0 0
## 1055 2.0 0.6666667 Short 0 0
## 1056 1.5 0.6666667 Medium 0 1
## 1057 2.0 1.0000000 Short 0 0
## 1058 3.5 0.6666667 Medium 0 1
## 1059 2.5 1.0000000 Short 0 0
## 1060 4.5 0.6666667 Short 0 0
## 1061 1.0 1.0000000 Medium 0 1
## 1062 2.0 0.6666667 Short 0 0
## 1063 1.5 1.0000000 Short 0 0
## 1064 5.0 1.3333333 Short 0 0
## 1065 4.5 1.3333333 Long 1 0
## 1066 1.0 1.0000000 Short 0 0
## 1067 2.5 0.6666667 Medium 0 1
## 1068 1.0 1.0000000 Short 0 0
## 1069 1.0 0.3333333 Medium 0 1
## 1070 1.0 0.6666667 Medium 0 1
## 1071 2.0 0.6666667 Short 0 0
## 1072 2.5 0.6666667 Medium 0 1
## 1073 5.0 0.6666667 Short 0 0
## 1074 3.5 0.6666667 Short 0 0
## 1075 3.5 1.0000000 Short 0 0
## 1076 2.5 0.6666667 Medium 0 1
## 1077 1.0 0.6666667 Short 0 0
## 1078 1.0 0.3333333 Medium 0 1
## 1079 1.0 1.0000000 Short 0 0
## 1080 4.0 0.6666667 Short 0 0
## 1081 5.0 0.6666667 Short 0 0
## 1082 3.0 0.6666667 Medium 0 1
## 1083 5.0 1.6666667 Short 0 0
## 1084 1.5 0.6666667 Short 0 0
## 1085 1.0 0.6666667 Short 0 0
## 1086 4.0 1.3333333 Short 0 0
## 1087 1.5 0.6666667 Medium 0 1
## 1088 2.0 0.6666667 Short 0 0
## 1089 2.0 1.0000000 Short 0 0
## 1090 2.5 0.6666667 Short 0 0
## 1091 3.0 0.6666667 Short 0 0
## 1092 1.0 0.6666667 Short 0 0
## 1093 2.0 0.6666667 Short 0 0
## 1094 1.0 0.6666667 Medium 0 1
## 1095 1.5 0.3333333 Medium 0 1
## 1096 1.0 0.6666667 Short 0 0
## 1097 2.5 0.6666667 Short 0 0
## 1098 3.0 0.6666667 Short 0 0
## 1099 1.0 0.6666667 Long 1 0
## 1100 1.0 0.6666667 Short 0 0
## 1101 1.5 0.6666667 Short 0 0
## 1102 5.0 1.6666667 Short 0 0
## 1103 5.0 1.0000000 Short 0 0
## 1104 1.5 1.0000000 Medium 0 1
## 1105 3.0 1.3333333 Short 0 0
## 1106 4.0 1.3333333 Medium 0 1
## 1107 1.0 0.3333333 Medium 0 1
## 1108 3.0 0.6666667 Short 0 0
## 1109 1.5 0.6666667 Medium 0 1
## 1110 1.5 0.3333333 Medium 0 1
## 1111 1.0 0.3333333 Short 0 0
## 1112 4.0 0.6666667 Short 0 0
## 1113 2.0 1.0000000 Short 0 0
## 1114 3.5 0.6666667 Medium 0 1
## 1115 1.5 0.6666667 Short 0 0
## 1116 4.5 0.6666667 Medium 0 1
## 1117 4.0 0.6666667 Short 0 0
## 1118 4.0 1.3333333 Short 0 0
## 1119 1.0 0.3333333 Medium 0 1
## 1120 3.5 1.0000000 Short 0 0
## 1121 1.0 0.3333333 Short 0 0
## 1122 3.5 1.0000000 Short 0 0
## 1123 1.0 1.0000000 Medium 0 1
## 1124 1.0 0.6666667 Short 0 0
## 1125 1.5 1.3333333 Medium 0 1
## 1126 1.0 0.6666667 Medium 0 1
## 1127 2.0 1.0000000 Short 0 0
## 1128 1.0 0.6666667 Short 0 0
## 1129 3.0 0.6666667 Short 0 0
## 1130 2.0 0.6666667 Short 0 0
## 1131 5.0 0.6666667 Short 0 0
## 1132 2.0 0.6666667 Short 0 0
## 1133 1.0 0.6666667 Long 1 0
## 1134 5.0 1.6666667 Long 1 0
## 1135 4.0 0.6666667 Short 0 0
## 1136 1.0 0.6666667 Short 0 0
## 1137 4.0 1.6666667 Short 0 0
## 1138 4.5 1.6666667 Medium 0 1
## 1139 2.0 1.0000000 Medium 0 1
## 1140 2.5 0.6666667 Medium 0 1
## 1141 4.0 0.6666667 Short 0 0
## 1142 1.5 1.0000000 Medium 0 1
## 1143 2.0 0.6666667 Short 0 0
## 1144 1.0 1.0000000 Short 0 0
## 1145 1.5 0.6666667 Short 0 0
## 1146 2.0 1.0000000 Short 0 0
## 1147 2.0 1.0000000 Long 1 0
## 1148 1.0 0.6666667 Short 0 0
## 1149 1.0 0.6666667 Medium 0 1
## 1150 2.0 0.6666667 Long 1 0
## 1151 1.0 1.0000000 Short 0 0
## 1152 1.0 0.6666667 Short 0 0
## 1153 3.0 0.6666667 Short 0 0
## 1154 1.0 0.6666667 Short 0 0
## 1155 2.0 0.6666667 Short 0 0
## 1156 1.5 0.6666667 Medium 0 1
## 1157 3.5 1.0000000 Long 1 0
## 1158 3.5 0.6666667 Medium 0 1
## 1159 3.0 1.3333333 Medium 0 1
## 1160 5.0 1.3333333 Short 0 0
## 1161 3.0 0.6666667 Medium 0 1
## 1162 2.5 0.6666667 Short 0 0
## 1163 1.5 0.6666667 Medium 0 1
## 1164 4.0 1.0000000 Short 0 0
## 1165 4.5 1.0000000 Short 0 0
## 1166 4.5 1.0000000 Short 0 0
## 1167 3.5 1.3333333 Short 0 0
## 1168 1.0 1.0000000 Short 0 0
## 1169 5.0 1.3333333 Short 0 0
## 1170 2.0 0.6666667 Medium 0 1
## 1171 4.5 1.6666667 Short 0 0
## 1172 2.0 0.6666667 Short 0 0
## 1173 5.0 0.6666667 Short 0 0
## 1174 3.5 1.3333333 Short 0 0
## 1175 1.5 0.3333333 Short 0 0
## 1176 2.5 0.6666667 Short 0 0
## 1177 1.0 0.6666667 Long 1 0
## 1178 4.0 1.0000000 Long 1 0
## 1179 4.5 0.6666667 Short 0 0
## 1180 4.0 0.6666667 Short 0 0
## 1181 4.0 0.6666667 Short 0 0
## 1182 2.0 0.6666667 Medium 0 1
## 1183 2.5 1.0000000 Short 0 0
## 1184 5.0 1.6666667 Long 1 0
## 1185 4.0 1.3333333 Medium 0 1
## 1186 5.0 0.6666667 Short 0 0
## 1187 5.0 0.6666667 Medium 0 1
## 1188 5.0 0.6666667 Long 1 0
## 1189 5.0 1.3333333 Short 0 0
## 1190 1.5 0.3333333 Short 0 0
## 1191 2.5 0.6666667 Short 0 0
## 1192 4.0 0.6666667 Medium 0 1
## 1193 5.0 1.3333333 Medium 0 1
## 1194 2.0 2.0000000 Short 0 0
## 1195 3.5 0.3333333 Long 1 0
## 1196 5.0 1.3333333 Short 0 0
## 1197 1.0 0.6666667 Medium 0 1
## 1198 5.0 1.3333333 Medium 0 1
## 1199 3.0 0.6666667 Long 1 0
## 1200 1.0 0.3333333 Medium 0 1
## 1201 5.0 0.6666667 Short 0 0
## 1202 1.5 1.3333333 Medium 0 1
## 1203 4.5 0.6666667 Short 0 0
## 1204 2.0 1.0000000 Short 0 0
## 1205 4.5 1.3333333 Short 0 0
## 1206 1.0 1.3333333 Short 0 0
## 1207 3.0 0.6666667 Short 0 0
## 1208 5.0 0.6666667 Short 0 0
## 1209 1.0 0.6666667 Medium 0 1
## 1210 3.5 1.0000000 Short 0 0
## 1211 4.5 1.6666667 Short 0 0
## 1212 3.5 0.3333333 Medium 0 1
## 1213 3.0 0.6666667 Short 0 0
## 1214 5.0 0.6666667 Short 0 0
## 1215 5.0 0.6666667 Short 0 0
## 1216 5.0 0.6666667 Short 0 0
## 1217 4.5 0.6666667 Short 0 0
## 1218 3.0 0.6666667 Medium 0 1
## 1219 5.0 1.3333333 Short 0 0
## 1220 3.5 0.6666667 Medium 0 1
## 1221 4.0 0.6666667 Short 0 0
## 1222 3.5 1.0000000 Short 0 0
## 1223 4.0 1.6666667 Medium 0 1
## 1224 2.5 0.6666667 Short 0 0
## 1225 3.0 1.0000000 Medium 0 1
## 1226 3.5 1.0000000 Short 0 0
## 1227 3.0 1.0000000 Short 0 0
## 1228 2.0 0.6666667 Short 0 0
## 1229 4.0 0.6666667 Short 0 0
## 1230 5.0 0.6666667 Short 0 0
## 1231 5.0 0.6666667 Long 1 0
## 1232 5.0 1.3333333 Short 0 0
## 1233 1.5 1.0000000 Short 0 0
## 1234 5.0 1.6666667 Short 0 0
## 1235 3.0 0.6666667 Short 0 0
## 1236 1.5 1.0000000 Medium 0 1
## 1237 3.0 1.0000000 Short 0 0
## 1238 5.0 0.6666667 Short 0 0
## 1239 2.0 0.6666667 Short 0 0
## 1240 5.0 1.3333333 Short 0 0
## 1241 3.0 0.6666667 Short 0 0
## 1242 4.0 1.0000000 Long 1 0
## 1243 2.0 0.3333333 Short 0 0
## 1244 1.5 0.6666667 Short 0 0
## 1245 2.0 0.6666667 Short 0 0
## 1246 3.5 1.0000000 Short 0 0
## 1247 1.0 0.6666667 Short 0 0
## 1248 4.0 1.0000000 Short 0 0
## 1249 4.0 1.0000000 Short 0 0
## 1250 1.5 0.6666667 Long 1 0
## 1251 4.5 0.6666667 Short 0 0
## 1252 5.0 0.6666667 Short 0 0
## 1253 2.5 1.0000000 Short 0 0
## 1254 2.5 1.0000000 Short 0 0
## 1255 1.0 0.3333333 Short 0 0
## 1256 3.5 0.6666667 Short 0 0
## 1257 1.0 1.3333333 Long 1 0
## 1258 2.0 0.6666667 Short 0 0
## 1259 1.0 1.0000000 Long 1 0
## 1260 4.0 1.0000000 Short 0 0
## 1261 1.0 0.6666667 Short 0 0
## 1262 3.5 1.6666667 Short 0 0
## 1263 3.0 1.6666667 Short 0 0
## 1264 4.0 1.0000000 Medium 0 1
## 1265 2.5 1.3333333 Short 0 0
## 1266 3.0 0.6666667 Medium 0 1
## 1267 1.5 1.3333333 Short 0 0
## 1268 3.0 0.6666667 Short 0 0
## 1269 2.0 0.6666667 Short 0 0
## 1270 2.0 0.6666667 Short 0 0
## 1271 4.5 1.6666667 Long 1 0
## 1272 1.5 0.6666667 Long 1 0
## 1273 1.5 1.0000000 Medium 0 1
## 1274 3.5 1.0000000 Medium 0 1
## 1275 2.5 0.6666667 Short 0 0
## 1276 4.0 0.6666667 Medium 0 1
## 1277 4.5 1.3333333 Long 1 0
## 1278 4.5 1.6666667 Medium 0 1
## 1279 4.0 0.6666667 Long 1 0
## 1280 4.5 2.0000000 Medium 0 1
## 1281 3.5 1.3333333 Short 0 0
## 1282 1.0 1.0000000 Long 1 0
## 1283 1.0 0.6666667 Short 0 0
## 1284 3.0 1.0000000 Short 0 0
## 1285 1.0 1.0000000 Medium 0 1
## 1286 3.5 0.6666667 Medium 0 1
## 1287 4.0 0.3333333 Medium 0 1
## 1288 2.5 0.3333333 Short 0 0
## 1289 4.0 1.3333333 Short 0 0
## 1290 1.0 0.3333333 Short 0 0
## 1291 4.0 1.6666667 Medium 0 1
## 1292 1.0 1.0000000 Long 1 0
## 1293 1.0 0.6666667 Short 0 0
## 1294 3.5 1.0000000 Long 1 0
## 1295 1.0 0.3333333 Short 0 0
## 1296 1.0 0.6666667 Short 0 0
## 1297 5.0 0.3333333 Medium 0 1
## 1298 3.5 0.6666667 Medium 0 1
## 1299 3.0 0.6666667 Short 0 0
## 1300 4.0 1.0000000 Long 1 0
## 1301 5.0 0.6666667 Short 0 0
## 1302 4.0 0.6666667 Short 0 0
## 1303 4.0 3.3333333 Short 0 0
## 1304 3.5 1.3333333 Short 0 0
## 1305 4.0 0.6666667 Short 0 0
## 1306 5.0 1.0000000 Short 0 0
## 1307 1.5 1.0000000 Short 0 0
## 1308 4.0 1.0000000 Short 0 0
## 1309 2.5 0.6666667 Medium 0 1
## 1310 1.5 0.6666667 Medium 0 1
## 1311 5.0 1.6666667 Long 1 0
## 1312 3.0 1.0000000 Medium 0 1
## 1313 3.5 1.3333333 Short 0 0
## 1314 4.0 1.3333333 Short 0 0
## 1315 4.0 0.6666667 Short 0 0
## 1316 4.0 0.6666667 Medium 0 1
## 1317 5.0 2.0000000 Short 0 0
## 1318 4.0 0.6666667 Long 1 0
## 1319 5.0 1.0000000 Medium 0 1
## 1320 4.0 0.6666667 Long 1 0
## 1321 4.5 0.6666667 Short 0 0
## 1322 1.5 0.3333333 Medium 0 1
## 1323 1.0 0.6666667 Short 0 0
## 1324 3.5 0.3333333 Medium 0 1
## 1325 5.0 0.6666667 Short 0 0
## 1326 5.0 1.6666667 Medium 0 1
## 1327 2.0 0.3333333 Short 0 0
## 1328 4.5 1.0000000 Short 0 0
## 1329 4.5 1.6666667 Long 1 0
## 1330 3.5 1.0000000 Short 0 0
## 1331 2.5 1.0000000 Short 0 0
## 1332 4.0 0.6666667 Short 0 0
## 1333 4.5 0.6666667 Short 0 0
## 1334 3.0 0.6666667 Short 0 0
## 1335 2.0 0.6666667 Short 0 0
## 1336 2.5 0.6666667 Short 0 0
## 1337 4.0 1.0000000 Short 0 0
## 1338 3.0 1.3333333 Short 0 0
## 1339 2.0 0.6666667 Short 0 0
## 1340 5.0 0.6666667 Long 1 0
## 1341 5.0 1.6666667 Medium 0 1
## 1342 4.0 0.6666667 Short 0 0
## 1343 5.0 0.6666667 Long 1 0
## 1344 1.5 1.0000000 Medium 0 1
## 1345 5.0 1.3333333 Medium 0 1
## 1346 5.0 1.3333333 Medium 0 1
## 1347 4.5 0.6666667 Medium 0 1
## 1348 2.0 0.6666667 Medium 0 1
## 1349 2.5 1.3333333 Medium 0 1
## 1350 4.5 0.6666667 Short 0 0
## 1351 3.5 0.6666667 Long 1 0
## 1352 2.5 0.6666667 Long 1 0
## 1353 5.0 0.6666667 Short 0 0
## 1354 2.5 0.6666667 Medium 0 1
## 1355 4.5 1.6666667 Short 0 0
## 1356 3.0 0.6666667 Medium 0 1
## 1357 4.5 1.3333333 Short 0 0
## 1358 1.0 0.3333333 Medium 0 1
## 1359 4.5 0.6666667 Short 0 0
## 1360 3.0 0.3333333 Long 1 0
## 1361 5.0 1.6666667 Short 0 0
## 1362 3.5 2.0000000 Short 0 0
## 1363 1.0 0.6666667 Short 0 0
## 1364 1.0 0.6666667 Short 0 0
## 1365 2.0 0.6666667 Medium 0 1
## 1366 3.0 0.6666667 Long 1 0
## 1367 1.5 0.6666667 Medium 0 1
## 1368 2.0 0.6666667 Short 0 0
## 1369 1.0 0.3333333 Medium 0 1
## 1370 3.5 1.3333333 Long 1 0
## 1371 2.5 0.6666667 Short 0 0
## 1372 1.5 0.3333333 Medium 0 1
## 1373 3.5 0.6666667 Short 0 0
## 1374 3.5 0.6666667 Short 0 0
## 1375 1.5 0.6666667 Long 1 0
## 1376 1.5 0.6666667 Short 0 0
## 1377 1.0 1.0000000 Medium 0 1
## 1378 2.5 0.6666667 Short 0 0
## 1379 3.0 1.0000000 Medium 0 1
## 1380 1.0 0.6666667 Medium 0 1
## 1381 3.0 1.0000000 Short 0 0
## 1382 1.0 0.6666667 Short 0 0
## 1383 4.5 1.0000000 Short 0 0
## 1384 4.0 0.6666667 Short 0 0
## 1385 4.0 0.6666667 Short 0 0
## 1386 2.0 2.6666667 Medium 0 1
## 1387 2.5 1.0000000 Short 0 0
## 1388 1.0 0.6666667 Short 0 0
## 1389 3.5 1.0000000 Medium 0 1
## 1390 1.0 0.6666667 Short 0 0
## 1391 2.5 0.6666667 Short 0 0
## 1392 2.0 0.6666667 Short 0 0
## 1393 2.0 0.6666667 Long 1 0
## 1394 1.0 0.6666667 Medium 0 1
## 1395 1.5 1.0000000 Short 0 0
## 1396 4.5 1.0000000 Long 1 0
## 1397 4.0 0.6666667 Short 0 0
## 1398 3.5 0.6666667 Short 0 0
## 1399 1.0 0.6666667 Medium 0 1
## 1400 1.5 0.3333333 Short 0 0
## 1401 5.0 0.6666667 Short 0 0
## 1402 4.5 0.6666667 Medium 0 1
## 1403 4.5 0.6666667 Medium 0 1
## 1404 3.0 0.6666667 Long 1 0
## 1405 4.0 0.6666667 Long 1 0
## 1406 3.5 1.3333333 Short 0 0
## 1407 3.0 0.6666667 Long 1 0
## 1408 2.5 0.6666667 Medium 0 1
## 1409 3.5 0.6666667 Medium 0 1
## 1410 5.0 0.6666667 Short 0 0
## 1411 4.0 1.6666667 Short 0 0
## 1412 1.0 0.6666667 Short 0 0
## 1413 2.5 0.6666667 Short 0 0
## 1414 3.0 0.6666667 Short 0 0
## 1415 1.0 0.6666667 Medium 0 1
## 1416 1.5 1.0000000 Long 1 0
## 1417 3.5 0.6666667 Long 1 0
## 1418 2.0 0.3333333 Short 0 0
## 1419 5.0 1.0000000 Short 0 0
## 1420 1.0 1.0000000 Short 0 0
## 1421 3.5 0.6666667 Short 0 0
## 1422 3.5 0.6666667 Short 0 0
## 1423 2.0 0.3333333 Short 0 0
## 1424 2.0 0.6666667 Short 0 0
## 1425 3.0 0.6666667 Short 0 0
## 1426 1.5 0.6666667 Short 0 0
## 1427 1.5 0.6666667 Short 0 0
## 1428 3.0 0.3333333 Short 0 0
## 1429 2.5 0.6666667 Short 0 0
## 1430 3.0 0.6666667 Short 0 0
## 1431 2.0 0.3333333 Short 0 0
## 1432 1.0 0.3333333 Medium 0 1
## 1433 5.0 0.6666667 Short 0 0
## 1434 2.0 0.6666667 Long 1 0
## 1435 4.5 1.3333333 Long 1 0
## 1436 5.0 0.6666667 Short 0 0
## 1437 3.0 1.3333333 Short 0 0
## 1438 4.5 0.6666667 Medium 0 1
## 1439 1.0 0.6666667 Short 0 0
## 1440 1.5 0.6666667 Short 0 0
## 1441 4.0 0.6666667 Short 0 0
## 1442 3.0 0.6666667 Short 0 0
## 1443 1.0 0.6666667 Short 0 0
## 1444 2.0 1.0000000 Medium 0 1
## 1445 5.0 1.3333333 Short 0 0
## 1446 1.0 0.6666667 Short 0 0
## 1447 3.5 0.6666667 Long 1 0
## 1448 4.0 1.3333333 Medium 0 1
## 1449 3.5 0.6666667 Short 0 0
## 1450 5.0 1.3333333 Short 0 0
## 1451 3.5 0.6666667 Medium 0 1
## 1452 2.0 0.6666667 Short 0 0
## 1453 1.0 1.0000000 Short 0 0
## 1454 3.0 1.6666667 Short 0 0
## 1455 1.0 1.0000000 Short 0 0
## 1456 2.0 0.6666667 Short 0 0
## 1457 3.0 0.6666667 Long 1 0
## 1458 4.0 0.6666667 Short 0 0
## 1459 2.0 0.6666667 Short 0 0
## 1460 4.5 0.6666667 Short 0 0
## 1461 1.5 0.6666667 Long 1 0
## 1462 5.0 1.3333333 Medium 0 1
## 1463 1.5 0.6666667 Short 0 0
## 1464 4.5 0.6666667 Long 1 0
## 1465 1.0 0.6666667 Medium 0 1
## 1466 1.0 0.6666667 Medium 0 1
## 1467 4.0 0.6666667 Long 1 0
## 1468 3.5 0.6666667 Short 0 0
## 1469 4.5 0.3333333 Medium 0 1
## 1470 5.0 0.6666667 Short 0 0
## 1471 2.0 0.6666667 Medium 0 1
## 1472 2.0 0.3333333 Short 0 0
## 1473 1.0 0.6666667 Short 0 0
## 1474 3.5 0.6666667 Medium 0 1
## 1475 2.0 0.6666667 Short 0 0
## 1476 3.5 0.6666667 Short 0 0
## 1477 2.0 0.3333333 Short 0 0
## 1478 1.5 0.3333333 Short 0 0
## 1479 4.0 1.0000000 Short 0 0
## 1480 2.5 1.0000000 Short 0 0
## 1481 4.5 0.6666667 Short 0 0
## 1482 1.0 0.6666667 Short 0 0
## 1483 1.0 0.6666667 Medium 0 1
## 1484 3.5 0.6666667 Short 0 0
## 1485 1.0 1.0000000 Long 1 0
## 1486 3.5 0.6666667 Long 1 0
## 1487 3.0 0.6666667 Short 0 0
## 1488 1.0 0.3333333 Medium 0 1
## 1489 5.0 0.6666667 Long 1 0
## 1490 3.5 0.6666667 Medium 0 1
## 1491 1.0 1.0000000 Medium 0 1
## 1492 4.0 1.0000000 Medium 0 1
## 1493 2.0 0.6666667 Short 0 0
## 1494 1.0 0.6666667 Medium 0 1
## 1495 1.0 0.6666667 Short 0 0
## 1496 2.0 0.6666667 Medium 0 1
## 1497 1.0 0.6666667 Short 0 0
## 1498 1.0 0.6666667 Long 1 0
## 1499 1.5 0.6666667 Medium 0 1
## 1500 1.0 0.6666667 Medium 0 1
## 1501 1.5 0.3333333 Short 0 0
## 1502 3.5 0.3333333 Medium 0 1
## 1503 1.0 0.6666667 Short 0 0
## 1504 2.0 1.0000000 Long 1 0
## 1505 3.0 0.6666667 Medium 0 1
## 1506 1.0 0.6666667 Long 1 0
## 1507 2.5 1.0000000 Short 0 0
## 1508 1.0 0.6666667 Long 1 0
## 1509 1.5 0.6666667 Short 0 0
## 1510 3.5 0.6666667 Medium 0 1
## 1511 1.0 0.3333333 Medium 0 1
## 1512 5.0 0.6666667 Short 0 0
## 1513 4.5 0.6666667 Short 0 0
## 1514 1.0 0.6666667 Short 0 0
## 1515 1.0 0.6666667 Short 0 0
## 1516 4.0 1.0000000 Medium 0 1
## 1517 4.5 1.3333333 Short 0 0
## 1518 4.0 2.0000000 Medium 0 1
## 1519 5.0 1.6666667 Short 0 0
## 1520 2.5 0.3333333 Medium 0 1
## 1521 5.0 3.3333333 Medium 0 1
## 1522 4.0 1.3333333 Short 0 0
## 1523 3.5 0.6666667 Medium 0 1
## 1524 1.0 0.3333333 Short 0 0
## 1525 4.5 1.3333333 Short 0 0
## 1526 2.5 0.6666667 Short 0 0
## 1527 1.0 0.3333333 Medium 0 1
## 1528 4.0 0.6666667 Short 0 0
## 1529 4.0 0.6666667 Medium 0 1
## 1530 1.5 0.6666667 Long 1 0
## 1531 1.5 1.0000000 Short 0 0
## 1532 4.5 1.0000000 Short 0 0
## 1533 5.0 1.3333333 Medium 0 1
## 1534 4.0 1.0000000 Short 0 0
## 1535 5.0 0.6666667 Short 0 0
## 1536 5.0 0.6666667 Short 0 0
## 1537 4.0 1.3333333 Short 0 0
## 1538 1.0 0.3333333 Medium 0 1
## 1539 4.5 1.3333333 Medium 0 1
## 1540 5.0 0.6666667 Short 0 0
## 1541 3.0 0.6666667 Medium 0 1
## 1542 2.0 1.3333333 Medium 0 1
## 1543 5.0 0.6666667 Medium 0 1
## 1544 1.0 0.6666667 Short 0 0
## 1545 4.5 1.0000000 Short 0 0
## 1546 2.0 0.6666667 Short 0 0
## 1547 4.0 0.6666667 Short 0 0
## 1548 3.0 0.6666667 Short 0 0
## 1549 4.0 0.6666667 Short 0 0
## 1550 2.5 0.6666667 Long 1 0
## 1551 1.0 0.6666667 Short 0 0
## 1552 5.0 1.6666667 Long 1 0
## 1553 3.5 0.6666667 Short 0 0
## 1554 1.5 0.6666667 Medium 0 1
## 1555 3.0 0.6666667 Short 0 0
## 1556 1.5 1.6666667 Medium 0 1
## 1557 1.0 0.6666667 Short 0 0
## 1558 5.0 1.6666667 Short 0 0
## 1559 2.0 1.0000000 Short 0 0
## 1560 1.0 0.6666667 Short 0 0
## 1561 1.0 0.6666667 Short 0 0
## 1562 1.5 0.3333333 Short 0 0
## 1563 2.5 0.3333333 Short 0 0
## 1564 4.5 0.6666667 Medium 0 1
## 1565 1.0 0.6666667 Medium 0 1
## 1566 4.5 0.6666667 Short 0 0
## 1567 2.0 0.6666667 Long 1 0
## 1568 2.0 0.6666667 Short 0 0
## 1569 1.0 0.3333333 Long 1 0
## 1570 4.0 0.6666667 Short 0 0
## 1571 2.0 0.3333333 Medium 0 1
## 1572 3.0 1.3333333 Long 1 0
## 1573 3.0 1.6666667 Medium 0 1
## 1574 3.0 3.3333333 Short 0 0
## 1575 1.0 0.6666667 Short 0 0
## 1576 1.5 0.3333333 Short 0 0
## 1577 1.0 1.0000000 Short 0 0
## 1578 2.0 0.6666667 Short 0 0
## 1579 2.5 0.6666667 Long 1 0
## 1580 3.0 0.3333333 Medium 0 1
## 1581 1.0 0.0000000 Short 0 0
## 1582 2.0 0.0000000 Short 0 0
## 1583 0.5 0.0000000 Short 0 0
## 1584 2.5 0.3333333 Short 0 0
## 1585 2.5 0.3333333 Short 0 0
## 1586 2.5 0.0000000 Short 0 0
## 1587 1.0 0.0000000 Short 0 0
## 1588 2.5 0.0000000 Short 0 0
## 1589 1.5 0.0000000 Short 0 0
## 1590 3.0 1.3333333 Short 0 0
## 1591 2.5 1.0000000 Short 0 0
## 1592 2.5 0.0000000 Short 0 0
## 1593 2.5 0.0000000 Short 0 0
## 1594 2.5 0.0000000 Short 0 0
## 1595 2.0 0.0000000 Short 0 0
## 1596 2.0 1.3333333 Short 0 0
## 1597 1.0 0.0000000 Short 0 0
## 1598 1.0 0.6666667 Short 0 0
## 1599 2.0 0.0000000 Short 0 0
## 1600 2.5 0.0000000 Short 0 0
## 1601 2.5 0.0000000 Short 0 0
## 1602 1.5 0.6666667 Short 0 0
## 1603 1.0 0.3333333 Short 0 0
## 1604 2.5 0.0000000 Short 0 0
## 1605 2.5 1.0000000 Short 0 0
## 1606 3.0 0.0000000 Short 0 0
## 1607 2.5 0.0000000 Short 0 0
## 1608 1.5 1.0000000 Short 0 0
## 1609 2.5 1.0000000 Short 0 0
## 1610 1.0 0.3333333 Short 0 0
## 1611 2.5 1.6666667 Short 0 0
## 1612 2.5 1.0000000 Short 0 0
## 1613 3.0 1.6666667 Short 0 0
## 1614 1.0 1.0000000 Short 0 0
## 1615 1.5 0.3333333 Short 0 0
## 1616 1.5 0.3333333 Short 0 0
## 1617 2.5 1.0000000 Short 0 0
## 1618 2.5 1.3333333 Short 0 0
## 1619 2.0 0.3333333 Short 0 0
## 1620 2.5 0.0000000 Short 0 0
## 1621 1.0 0.3333333 Short 0 0
## 1622 2.0 0.0000000 Short 0 0
## 1623 2.5 0.0000000 Short 0 0
## 1624 2.5 0.3333333 Short 0 0
## 1625 2.0 0.3333333 Short 0 0
## 1626 2.0 1.0000000 Short 0 0
## 1627 3.0 1.6666667 Short 0 0
## 1628 1.5 0.0000000 Short 0 0
## 1629 3.0 1.3333333 Short 0 0
## 1630 3.0 0.0000000 Short 0 0
## 1631 2.5 0.3333333 Short 0 0
## 1632 2.5 0.0000000 Short 0 0
## 1633 2.5 0.6666667 Short 0 0
## 1634 3.0 0.0000000 Short 0 0
## 1635 1.0 0.0000000 Short 0 0
## 1636 2.0 1.0000000 Short 0 0
## 1637 3.0 1.3333333 Short 0 0
## 1638 2.5 1.0000000 Short 0 0
## 1639 3.0 1.0000000 Short 0 0
## 1640 3.0 1.3333333 Short 0 0
## 1641 2.0 0.0000000 Short 0 0
## 1642 2.0 1.0000000 Short 0 0
## 1643 3.0 1.3333333 Short 0 0
## 1644 2.0 0.0000000 Short 0 0
## 1645 2.0 0.0000000 Short 0 0
## 1646 2.5 0.6666667 Short 0 0
## 1647 2.5 1.3333333 Short 0 0
## 1648 2.5 1.3333333 Short 0 0
## 1649 1.0 0.0000000 Short 0 0
## 1650 1.5 1.0000000 Short 0 0
## 1651 3.0 1.3333333 Short 0 0
## 1652 1.5 0.0000000 Short 0 0
## 1653 1.0 0.6666667 Short 0 0
## 1654 1.0 0.0000000 Short 0 0
## 1655 2.5 0.3333333 Short 0 0
## 1656 0.5 0.0000000 Short 0 0
## 1657 2.0 1.0000000 Short 0 0
## 1658 3.0 1.3333333 Short 0 0
## 1659 2.5 1.3333333 Short 0 0
## 1660 2.0 0.0000000 Short 0 0
## 1661 3.0 1.3333333 Short 0 0
## 1662 2.5 1.3333333 Short 0 0
## 1663 2.0 1.0000000 Short 0 0
## 1664 1.5 0.0000000 Short 0 0
## 1665 2.5 0.0000000 Short 0 0
## 1666 0.5 0.0000000 Short 0 0
## 1667 1.5 0.3333333 Short 0 0
## 1668 2.5 0.0000000 Short 0 0
## 1669 3.0 0.0000000 Short 0 0
## 1670 1.0 0.3333333 Short 0 0
## 1671 2.5 1.0000000 Short 0 0
## 1672 2.0 1.0000000 Short 0 0
## 1673 1.0 1.0000000 Short 0 0
## 1674 2.5 1.3333333 Short 0 0
## 1675 2.0 0.3333333 Short 0 0
## 1676 2.5 0.0000000 Short 0 0
## 1677 1.0 0.0000000 Short 0 0
## 1678 2.0 0.6666667 Short 0 0
## 1679 3.0 1.3333333 Short 0 0
## 1680 2.5 0.0000000 Short 0 0
## 1681 2.0 1.0000000 Short 0 0
## 1682 2.0 0.6666667 Short 0 0
## 1683 3.0 1.6666667 Short 0 0
## 1684 3.0 1.3333333 Short 0 0
## 1685 2.5 0.0000000 Short 0 0
## 1686 3.0 1.0000000 Short 0 0
## 1687 2.5 1.3333333 Short 0 0
## 1688 2.5 1.0000000 Short 0 0
## 1689 2.0 0.0000000 Short 0 0
## 1690 2.0 1.0000000 Short 0 0
## 1691 1.0 0.3333333 Short 0 0
## 1692 2.5 1.0000000 Short 0 0
## 1693 2.5 1.0000000 Short 0 0
## 1694 2.5 0.0000000 Short 0 0
## 1695 3.0 1.3333333 Short 0 0
## 1696 2.5 0.0000000 Short 0 0
## 1697 2.5 0.0000000 Short 0 0
## 1698 3.0 1.0000000 Short 0 0
## 1699 1.5 1.0000000 Short 0 0
## 1700 3.0 1.3333333 Short 0 0
## 1701 2.5 0.6666667 Short 0 0
## 1702 3.0 1.3333333 Short 0 0
## 1703 2.0 1.0000000 Short 0 0
## 1704 3.0 1.3333333 Short 0 0
## 1705 2.5 0.0000000 Short 0 0
## 1706 2.0 0.0000000 Short 0 0
## 1707 2.5 1.0000000 Short 0 0
## 1708 2.5 1.0000000 Short 0 0
## 1709 2.5 1.3333333 Short 0 0
## 1710 3.0 1.3333333 Short 0 0
## 1711 2.5 1.3333333 Short 0 0
## 1712 2.5 1.0000000 Short 0 0
## 1713 2.5 0.0000000 Short 0 0
## 1714 2.5 0.0000000 Short 0 0
## 1715 2.0 0.3333333 Short 0 0
## 1716 3.0 0.0000000 Short 0 0
## 1717 2.5 1.6666667 Short 0 0
## 1718 2.5 0.0000000 Short 0 0
## 1719 2.0 1.0000000 Short 0 0
## 1720 1.5 0.6666667 Short 0 0
## 1721 2.5 0.0000000 Short 0 0
## 1722 2.5 0.0000000 Short 0 0
## 1723 2.5 1.3333333 Short 0 0
## 1724 3.0 1.6666667 Short 0 0
## 1725 1.0 1.0000000 Short 0 0
## 1726 2.5 1.3333333 Short 0 0
## 1727 1.0 0.0000000 Short 0 0
## 1728 2.0 0.0000000 Short 0 0
## 1729 3.0 1.6666667 Short 0 0
## 1730 3.0 1.0000000 Short 0 0
## 1731 2.5 0.0000000 Short 0 0
## 1732 3.0 1.3333333 Short 0 0
## 1733 2.0 0.6666667 Short 0 0
## 1734 3.0 0.0000000 Short 0 0
## 1735 3.0 1.0000000 Short 0 0
## 1736 1.0 0.0000000 Short 0 0
## 1737 2.5 1.0000000 Short 0 0
## 1738 3.0 1.3333333 Short 0 0
## 1739 3.0 0.0000000 Short 0 0
## 1740 2.5 1.3333333 Short 0 0
## 1741 2.5 1.3333333 Short 0 0
## 1742 2.0 0.0000000 Short 0 0
## 1743 2.5 1.3333333 Short 0 0
## 1744 1.0 0.3333333 Short 0 0
## 1745 3.0 1.0000000 Short 0 0
## 1746 2.5 1.0000000 Short 0 0
## 1747 3.0 1.3333333 Short 0 0
## 1748 2.5 1.0000000 Short 0 0
## 1749 2.0 1.0000000 Short 0 0
## 1750 1.0 0.3333333 Short 0 0
## 1751 3.0 0.0000000 Short 0 0
## 1752 2.0 1.0000000 Short 0 0
## 1753 2.5 0.0000000 Short 0 0
## 1754 1.0 1.3333333 Short 0 0
## 1755 3.0 0.0000000 Short 0 0
## 1756 1.5 0.6666667 Short 0 0
## 1757 3.0 1.6666667 Short 0 0
## 1758 1.5 0.6666667 Short 0 0
## 1759 2.5 1.0000000 Short 0 0
## 1760 2.5 1.0000000 Short 0 0
## 1761 1.0 0.0000000 Short 0 0
## 1762 2.5 0.0000000 Short 0 0
## 1763 3.0 1.0000000 Short 0 0
## 1764 2.5 1.0000000 Short 0 0
## 1765 3.0 1.6666667 Short 0 0
## 1766 2.0 0.6666667 Short 0 0
## 1767 2.0 1.0000000 Short 0 0
## 1768 1.5 1.3333333 Short 0 0
## 1769 3.0 1.0000000 Short 0 0
## 1770 2.5 0.0000000 Short 0 0
## 1771 2.5 0.6666667 Short 0 0
## 1772 2.5 1.3333333 Short 0 0
## 1773 3.0 1.3333333 Short 0 0
## 1774 2.0 1.0000000 Short 0 0
## 1775 2.5 1.0000000 Short 0 0
## 1776 1.5 0.0000000 Short 0 0
## 1777 1.0 0.3333333 Short 0 0
## 1778 2.5 1.3333333 Short 0 0
## 1779 2.0 0.0000000 Short 0 0
## 1780 3.0 1.3333333 Short 0 0
## 1781 1.5 0.3333333 Short 0 0
## 1782 1.5 0.3333333 Short 0 0
## 1783 2.0 0.3333333 Short 0 0
## 1784 1.5 1.0000000 Short 0 0
## 1785 2.5 1.0000000 Short 0 0
## 1786 2.5 1.0000000 Short 0 0
## 1787 2.0 0.6666667 Short 0 0
## 1788 3.0 0.0000000 Short 0 0
## 1789 1.0 1.0000000 Short 0 0
## 1790 3.0 0.0000000 Short 0 0
## 1791 3.0 1.3333333 Short 0 0
## 1792 2.5 0.0000000 Short 0 0
## 1793 3.0 0.0000000 Short 0 0
## 1794 2.0 0.6666667 Short 0 0
## 1795 2.5 0.0000000 Short 0 0
## 1796 3.0 1.6666667 Short 0 0
## 1797 2.5 1.0000000 Short 0 0
## 1798 3.0 1.3333333 Short 0 0
## 1799 3.0 1.6666667 Short 0 0
## 1800 2.5 1.0000000 Short 0 0
## 1801 3.0 1.3333333 Short 0 0
## 1802 3.0 1.0000000 Short 0 0
## 1803 2.5 1.3333333 Short 0 0
## 1804 2.0 0.0000000 Short 0 0
## 1805 2.5 1.0000000 Short 0 0
## 1806 1.5 0.6666667 Short 0 0
## 1807 3.0 1.0000000 Short 0 0
## 1808 3.0 0.0000000 Short 0 0
## 1809 2.0 0.3333333 Short 0 0
## 1810 3.0 1.0000000 Short 0 0
## 1811 1.0 0.3333333 Short 0 0
## 1812 2.0 0.3333333 Short 0 0
## 1813 2.5 0.0000000 Short 0 0
## 1814 2.5 1.0000000 Short 0 0
## 1815 2.5 0.0000000 Short 0 0
## 1816 2.5 1.3333333 Short 0 0
## 1817 0.5 0.0000000 Short 0 0
## 1818 2.5 0.0000000 Short 0 0
## 1819 2.0 1.0000000 Short 0 0
## 1820 3.0 0.3333333 Short 0 0
## 1821 1.0 0.0000000 Short 0 0
## 1822 3.0 1.6666667 Short 0 0
## 1823 3.0 1.6666667 Short 0 0
## 1824 2.5 0.6666667 Short 0 0
## 1825 2.0 0.6666667 Short 0 0
## 1826 2.5 0.0000000 Short 0 0
## 1827 2.5 1.3333333 Short 0 0
## 1828 1.0 0.0000000 Short 0 0
## 1829 2.5 1.0000000 Short 0 0
## 1830 2.5 0.0000000 Short 0 0
## 1831 2.5 1.0000000 Short 0 0
## 1832 2.0 0.0000000 Short 0 0
## 1833 3.0 0.0000000 Short 0 0
## 1834 3.0 1.0000000 Short 0 0
## 1835 2.5 1.3333333 Short 0 0
## 1836 2.5 1.0000000 Short 0 0
## 1837 2.0 1.0000000 Short 0 0
## 1838 1.0 0.6666667 Short 0 0
## 1839 1.0 0.0000000 Short 0 0
## 1840 2.5 1.0000000 Short 0 0
## 1841 2.0 1.0000000 Short 0 0
## 1842 1.5 0.0000000 Short 0 0
## 1843 1.0 0.0000000 Short 0 0
## 1844 1.5 0.3333333 Short 0 0
## 1845 2.0 1.3333333 Short 0 0
## 1846 1.0 0.0000000 Short 0 0
## 1847 2.5 1.3333333 Short 0 0
## 1848 1.5 0.3333333 Short 0 0
## 1849 2.0 1.0000000 Short 0 0
## 1850 3.0 0.6666667 Short 0 0
## 1851 0.5 0.0000000 Short 0 0
## 1852 2.5 1.0000000 Short 0 0
## 1853 3.0 0.0000000 Short 0 0
## 1854 2.5 0.3333333 Short 0 0
## 1855 2.5 1.0000000 Short 0 0
## 1856 2.5 1.0000000 Short 0 0
## 1857 3.0 1.3333333 Short 0 0
## 1858 3.0 1.3333333 Short 0 0
## 1859 1.5 1.0000000 Short 0 0
## 1860 3.0 1.3333333 Short 0 0
## 1861 2.5 0.6666667 Short 0 0
## 1862 2.0 1.0000000 Short 0 0
## 1863 2.5 0.0000000 Short 0 0
## 1864 2.5 1.3333333 Short 0 0
## 1865 3.0 1.0000000 Short 0 0
## 1866 2.5 1.0000000 Short 0 0
## 1867 3.0 1.0000000 Short 0 0
## 1868 3.0 1.6666667 Short 0 0
## 1869 2.5 1.3333333 Short 0 0
## 1870 2.0 1.0000000 Short 0 0
## 1871 2.0 0.0000000 Short 0 0
## 1872 2.5 1.0000000 Short 0 0
## 1873 1.0 0.3333333 Short 0 0
## 1874 2.5 0.0000000 Short 0 0
## 1875 1.0 0.3333333 Short 0 0
## 1876 3.0 0.0000000 Short 0 0
## 1877 2.0 0.6666667 Short 0 0
## 1878 2.5 0.3333333 Short 0 0
## 1879 3.0 0.0000000 Short 0 0
## 1880 2.5 0.0000000 Short 0 0
## 1881 3.0 0.0000000 Short 0 0
## 1882 2.0 1.0000000 Short 0 0
## 1883 3.0 1.0000000 Short 0 0
## 1884 2.0 0.0000000 Short 0 0
## 1885 3.0 1.6666667 Short 0 0
## 1886 3.0 1.0000000 Short 0 0
## 1887 2.5 0.0000000 Short 0 0
## 1888 2.5 1.0000000 Short 0 0
## 1889 3.0 1.3333333 Short 0 0
## 1890 3.0 1.0000000 Short 0 0
## 1891 2.5 1.0000000 Short 0 0
## 1892 3.0 1.6666667 Short 0 0
## 1893 3.0 1.0000000 Short 0 0
## 1894 2.0 0.0000000 Short 0 0
## 1895 2.5 0.0000000 Short 0 0
## 1896 2.5 1.0000000 Short 0 0
## 1897 2.5 0.0000000 Short 0 0
## 1898 2.5 0.0000000 Short 0 0
## 1899 0.5 0.3333333 Short 0 0
## 1900 2.0 1.0000000 Short 0 0
## 1901 2.0 0.0000000 Short 0 0
## 1902 2.5 1.3333333 Short 0 0
## 1903 2.5 1.0000000 Short 0 0
## 1904 2.5 1.0000000 Short 0 0
## 1905 2.5 0.0000000 Short 0 0
## 1906 2.5 0.3333333 Short 0 0
## 1907 2.5 0.0000000 Short 0 0
## 1908 2.5 1.0000000 Short 0 0
## 1909 2.5 1.3333333 Short 0 0
## 1910 3.0 1.6666667 Short 0 0
## 1911 2.5 0.0000000 Short 0 0
## 1912 1.0 0.0000000 Short 0 0
## 1913 2.0 0.0000000 Short 0 0
## 1914 1.0 0.6666667 Short 0 0
## 1915 2.5 1.0000000 Short 0 0
## 1916 3.0 1.0000000 Short 0 0
## 1917 1.0 0.3333333 Short 0 0
## 1918 2.5 1.0000000 Short 0 0
## 1919 3.0 1.6666667 Short 0 0
## 1920 3.0 1.3333333 Short 0 0
## 1921 0.5 0.0000000 Short 0 0
## 1922 1.0 0.3333333 Short 0 0
## 1923 3.0 0.6666667 Short 0 0
## 1924 2.5 1.3333333 Short 0 0
## 1925 2.0 0.0000000 Short 0 0
## 1926 2.5 0.6666667 Short 0 0
## 1927 2.5 1.3333333 Short 0 0
## 1928 2.5 1.0000000 Short 0 0
## 1929 3.0 0.0000000 Short 0 0
## 1930 2.5 1.3333333 Short 0 0
## 1931 3.0 1.3333333 Short 0 0
## 1932 1.0 0.3333333 Short 0 0
## 1933 2.5 0.0000000 Short 0 0
## 1934 2.5 1.3333333 Short 0 0
## 1935 1.0 0.3333333 Short 0 0
## 1936 2.5 0.0000000 Short 0 0
## 1937 2.0 0.0000000 Short 0 0
## 1938 2.5 0.6666667 Short 0 0
## 1939 2.5 0.0000000 Short 0 0
## 1940 3.0 1.6666667 Short 0 0
## 1941 2.5 0.0000000 Short 0 0
## 1942 3.0 1.3333333 Short 0 0
## 1943 2.0 0.6666667 Short 0 0
## 1944 2.5 1.3333333 Short 0 0
## 1945 3.0 1.6666667 Short 0 0
## 1946 2.5 1.0000000 Short 0 0
## 1947 2.5 1.0000000 Short 0 0
## 1948 3.0 1.3333333 Short 0 0
## 1949 1.0 0.0000000 Short 0 0
## 1950 3.0 1.0000000 Short 0 0
## 1951 1.5 1.0000000 Short 0 0
## 1952 3.0 1.3333333 Short 0 0
## 1953 3.0 0.0000000 Short 0 0
## 1954 3.0 0.0000000 Short 0 0
## 1955 1.0 0.3333333 Short 0 0
## 1956 2.0 0.0000000 Short 0 0
## 1957 1.0 0.0000000 Short 0 0
## 1958 2.0 0.0000000 Short 0 0
## 1959 3.0 1.6666667 Short 0 0
## 1960 3.0 1.0000000 Short 0 0
## 1961 2.0 1.3333333 Short 0 0
## 1962 2.0 1.0000000 Short 0 0
## 1963 2.0 1.0000000 Short 0 0
## 1964 1.5 0.3333333 Short 0 0
## 1965 2.5 1.3333333 Short 0 0
## 1966 3.0 1.3333333 Short 0 0
## 1967 2.5 0.0000000 Short 0 0
## 1968 1.5 1.0000000 Short 0 0
## 1969 0.5 0.0000000 Short 0 0
## 1970 3.0 0.6666667 Short 0 0
## 1971 3.0 1.6666667 Short 0 0
## 1972 1.0 0.3333333 Short 0 0
## 1973 2.5 0.0000000 Short 0 0
## 1974 3.0 1.0000000 Short 0 0
## 1975 3.0 1.6666667 Short 0 0
## 1976 1.0 0.3333333 Short 0 0
## 1977 2.5 0.0000000 Short 0 0
## 1978 2.5 0.0000000 Short 0 0
## 1979 3.0 1.6666667 Short 0 0
## 1980 3.0 1.3333333 Short 0 0
## 1981 2.5 1.3333333 Short 0 0
## 1982 1.5 0.0000000 Short 0 0
## 1983 2.0 1.0000000 Short 0 0
## 1984 3.0 1.3333333 Short 0 0
## 1985 2.5 1.0000000 Short 0 0
## 1986 2.5 1.3333333 Short 0 0
## 1987 1.0 0.3333333 Short 0 0
## 1988 3.0 1.3333333 Short 0 0
## 1989 2.5 1.0000000 Short 0 0
## 1990 2.0 0.3333333 Short 0 0
## 1991 2.5 1.3333333 Short 0 0
## 1992 2.5 0.0000000 Short 0 0
## 1993 1.5 0.0000000 Short 0 0
## 1994 2.5 1.0000000 Short 0 0
## 1995 2.5 0.0000000 Short 0 0
## 1996 3.0 1.3333333 Short 0 0
## 1997 3.0 0.0000000 Short 0 0
## 1998 3.0 1.3333333 Short 0 0
## 1999 3.0 1.3333333 Short 0 0
## 2000 1.5 0.3333333 Short 0 0
## 2001 1.0 0.3333333 Short 0 0
## 2002 3.0 1.6666667 Short 0 0
## 2003 1.5 0.6666667 Short 0 0
## 2004 2.5 1.3333333 Short 0 0
## 2005 1.0 0.0000000 Short 0 0
## 2006 3.0 0.0000000 Short 0 0
## 2007 2.5 1.3333333 Short 0 0
## 2008 1.0 0.3333333 Short 0 0
## 2009 2.0 0.0000000 Short 0 0
## 2010 3.0 0.0000000 Short 0 0
## 2011 2.0 0.6666667 Short 0 0
## 2012 3.0 0.0000000 Short 0 0
## 2013 2.0 0.0000000 Short 0 0
## 2014 2.5 1.0000000 Short 0 0
## 2015 1.0 0.0000000 Short 0 0
## 2016 1.0 0.0000000 Short 0 0
## 2017 3.0 1.0000000 Short 0 0
## 2018 1.0 0.0000000 Short 0 0
## 2019 2.5 1.0000000 Short 0 0
## 2020 1.5 0.6666667 Short 0 0
## 2021 1.0 0.6666667 Short 0 0
## 2022 2.0 1.0000000 Short 0 0
## 2023 1.0 0.3333333 Short 0 0
## 2024 2.5 1.0000000 Short 0 0
## 2025 1.0 0.3333333 Short 0 0
## 2026 1.0 0.0000000 Short 0 0
## 2027 3.0 1.3333333 Short 0 0
## 2028 1.5 1.0000000 Short 0 0
## 2029 2.5 1.3333333 Short 0 0
## 2030 2.5 1.0000000 Short 0 0
## 2031 2.5 1.3333333 Short 0 0
## 2032 3.0 1.0000000 Short 0 0
## 2033 1.0 0.3333333 Short 0 0
## 2034 3.0 0.0000000 Short 0 0
## 2035 1.5 0.3333333 Short 0 0
## 2036 1.0 0.0000000 Short 0 0
## 2037 1.0 0.0000000 Short 0 0
## 2038 3.0 1.3333333 Short 0 0
## 2039 1.5 0.0000000 Short 0 0
## 2040 3.0 1.3333333 Short 0 0
## 2041 0.5 0.0000000 Short 0 0
## 2042 3.0 0.0000000 Short 0 0
## 2043 2.5 1.0000000 Short 0 0
## 2044 1.5 0.3333333 Short 0 0
## 2045 1.0 0.3333333 Short 0 0
## 2046 1.0 0.3333333 Short 0 0
## 2047 2.5 0.0000000 Short 0 0
## 2048 3.0 1.3333333 Short 0 0
## 2049 1.0 0.3333333 Short 0 0
## 2050 2.0 1.0000000 Short 0 0
## 2051 2.0 1.0000000 Short 0 0
## 2052 1.5 0.6666667 Short 0 0
## 2053 2.5 0.3333333 Short 0 0
## 2054 1.0 1.0000000 Short 0 0
## 2055 1.5 0.0000000 Short 0 0
## 2056 2.5 0.3333333 Short 0 0
## 2057 2.0 0.6666667 Short 0 0
## 2058 2.0 0.0000000 Short 0 0
## 2059 1.0 0.3333333 Short 0 0
## 2060 1.0 0.3333333 Short 0 0
## 2061 1.5 0.0000000 Short 0 0
## 2062 1.0 0.3333333 Short 0 0
## 2063 1.0 0.3333333 Short 0 0
## 2064 1.5 0.0000000 Short 0 0
## DurationCatShort cluster_new
## 1 0 2
## 2 0 2
## 3 1 4
## 4 0 5
## 5 1 4
## 6 1 1
## 7 1 1
## 8 1 1
## 9 1 1
## 10 1 4
## 11 1 1
## 12 1 1
## 13 1 1
## 14 1 4
## 15 1 4
## 16 0 2
## 17 1 4
## 18 1 1
## 19 1 4
## 20 1 1
## 21 1 1
## 22 0 5
## 23 1 1
## 24 1 4
## 25 1 1
## 26 1 4
## 27 0 5
## 28 0 3
## 29 0 5
## 30 1 4
## 31 1 1
## 32 1 1
## 33 1 1
## 34 1 1
## 35 1 1
## 36 1 1
## 37 1 1
## 38 1 1
## 39 0 3
## 40 0 5
## 41 0 2
## 42 0 2
## 43 1 1
## 44 1 1
## 45 0 3
## 46 1 1
## 47 1 1
## 48 1 1
## 49 1 1
## 50 0 3
## 51 1 1
## 52 1 4
## 53 0 3
## 54 1 4
## 55 1 1
## 56 1 1
## 57 0 2
## 58 0 3
## 59 1 1
## 60 1 1
## 61 0 3
## 62 1 1
## 63 1 4
## 64 1 1
## 65 1 1
## 66 1 1
## 67 1 1
## 68 1 1
## 69 1 1
## 70 1 4
## 71 0 5
## 72 0 5
## 73 1 4
## 74 1 4
## 75 1 1
## 76 1 1
## 77 0 3
## 78 1 1
## 79 1 4
## 80 0 5
## 81 0 2
## 82 0 5
## 83 0 5
## 84 0 3
## 85 1 1
## 86 0 3
## 87 1 4
## 88 1 4
## 89 1 4
## 90 1 4
## 91 1 1
## 92 0 3
## 93 1 4
## 94 1 4
## 95 1 1
## 96 0 2
## 97 1 1
## 98 1 1
## 99 1 1
## 100 0 2
## 101 1 4
## 102 1 1
## 103 1 1
## 104 1 1
## 105 0 5
## 106 1 1
## 107 0 2
## 108 1 1
## 109 0 5
## 110 1 1
## 111 1 1
## 112 1 4
## 113 0 5
## 114 0 5
## 115 0 3
## 116 1 4
## 117 0 5
## 118 1 4
## 119 0 5
## 120 0 2
## 121 0 3
## 122 0 5
## 123 0 3
## 124 1 1
## 125 0 2
## 126 0 3
## 127 1 1
## 128 1 1
## 129 0 3
## 130 1 1
## 131 0 3
## 132 1 1
## 133 1 4
## 134 0 2
## 135 1 1
## 136 1 1
## 137 0 3
## 138 1 4
## 139 0 5
## 140 0 5
## 141 0 5
## 142 1 1
## 143 1 1
## 144 1 1
## 145 0 3
## 146 0 3
## 147 1 1
## 148 0 5
## 149 1 4
## 150 0 3
## 151 0 3
## 152 0 5
## 153 1 1
## 154 1 4
## 155 1 1
## 156 0 5
## 157 0 3
## 158 1 1
## 159 0 5
## 160 0 3
## 161 0 5
## 162 1 1
## 163 1 1
## 164 0 5
## 165 1 4
## 166 1 1
## 167 1 4
## 168 1 1
## 169 1 1
## 170 1 1
## 171 1 1
## 172 1 4
## 173 1 1
## 174 1 1
## 175 1 1
## 176 0 5
## 177 0 3
## 178 0 2
## 179 1 1
## 180 1 4
## 181 0 5
## 182 1 1
## 183 1 4
## 184 1 4
## 185 1 1
## 186 0 3
## 187 1 4
## 188 0 3
## 189 1 1
## 190 0 5
## 191 0 5
## 192 0 5
## 193 0 5
## 194 1 4
## 195 0 5
## 196 0 5
## 197 1 1
## 198 1 1
## 199 0 5
## 200 1 1
## 201 0 2
## 202 1 4
## 203 0 5
## 204 0 5
## 205 1 1
## 206 1 1
## 207 1 1
## 208 0 3
## 209 0 3
## 210 0 5
## 211 0 3
## 212 1 1
## 213 0 5
## 214 0 5
## 215 1 1
## 216 1 4
## 217 1 1
## 218 0 2
## 219 1 1
## 220 0 5
## 221 1 1
## 222 1 1
## 223 1 1
## 224 1 1
## 225 0 2
## 226 0 5
## 227 0 2
## 228 1 1
## 229 0 5
## 230 0 5
## 231 0 3
## 232 0 2
## 233 1 1
## 234 0 5
## 235 0 5
## 236 1 1
## 237 1 1
## 238 0 5
## 239 0 3
## 240 0 3
## 241 1 1
## 242 1 4
## 243 0 5
## 244 1 1
## 245 0 5
## 246 1 1
## 247 0 5
## 248 1 4
## 249 0 3
## 250 1 1
## 251 1 1
## 252 1 1
## 253 1 1
## 254 0 3
## 255 1 1
## 256 0 5
## 257 1 4
## 258 0 3
## 259 1 1
## 260 0 5
## 261 1 4
## 262 0 2
## 263 1 1
## 264 1 1
## 265 1 1
## 266 0 5
## 267 0 3
## 268 1 1
## 269 1 4
## 270 1 1
## 271 1 1
## 272 1 4
## 273 1 1
## 274 1 1
## 275 0 5
## 276 1 1
## 277 1 4
## 278 1 1
## 279 1 4
## 280 0 3
## 281 1 1
## 282 1 1
## 283 0 5
## 284 0 3
## 285 0 5
## 286 0 3
## 287 1 1
## 288 1 1
## 289 0 5
## 290 1 1
## 291 1 1
## 292 1 4
## 293 1 1
## 294 1 4
## 295 0 3
## 296 1 1
## 297 1 4
## 298 1 4
## 299 1 1
## 300 0 3
## 301 1 4
## 302 0 5
## 303 1 4
## 304 0 5
## 305 0 3
## 306 0 5
## 307 1 1
## 308 1 1
## 309 1 4
## 310 0 5
## 311 1 1
## 312 0 5
## 313 1 1
## 314 0 2
## 315 0 2
## 316 1 1
## 317 1 1
## 318 1 4
## 319 0 5
## 320 0 3
## 321 0 3
## 322 0 5
## 323 1 1
## 324 1 1
## 325 0 5
## 326 0 5
## 327 0 5
## 328 0 5
## 329 1 4
## 330 0 5
## 331 1 1
## 332 1 1
## 333 1 4
## 334 0 5
## 335 1 1
## 336 0 2
## 337 0 3
## 338 1 4
## 339 1 4
## 340 0 5
## 341 1 1
## 342 1 1
## 343 0 5
## 344 1 1
## 345 1 1
## 346 1 1
## 347 1 1
## 348 1 1
## 349 1 1
## 350 1 4
## 351 1 1
## 352 1 1
## 353 0 5
## 354 1 4
## 355 0 5
## 356 0 3
## 357 1 1
## 358 0 5
## 359 1 1
## 360 1 4
## 361 1 1
## 362 1 1
## 363 0 5
## 364 1 1
## 365 1 1
## 366 1 4
## 367 1 1
## 368 0 5
## 369 1 1
## 370 0 2
## 371 1 1
## 372 1 4
## 373 0 2
## 374 1 1
## 375 1 1
## 376 0 5
## 377 0 5
## 378 1 1
## 379 0 2
## 380 0 3
## 381 1 4
## 382 1 4
## 383 0 3
## 384 1 4
## 385 1 1
## 386 1 1
## 387 1 1
## 388 0 2
## 389 1 1
## 390 1 4
## 391 0 5
## 392 0 5
## 393 0 5
## 394 0 3
## 395 0 5
## 396 0 2
## 397 0 3
## 398 1 4
## 399 1 1
## 400 1 1
## 401 1 1
## 402 1 1
## 403 1 4
## 404 1 1
## 405 0 3
## 406 1 1
## 407 1 1
## 408 1 1
## 409 1 1
## 410 1 1
## 411 0 5
## 412 1 4
## 413 1 1
## 414 1 1
## 415 1 1
## 416 1 1
## 417 1 1
## 418 1 4
## 419 1 1
## 420 1 1
## 421 1 1
## 422 1 1
## 423 0 5
## 424 1 1
## 425 0 5
## 426 0 5
## 427 0 2
## 428 0 2
## 429 1 1
## 430 1 1
## 431 1 1
## 432 1 1
## 433 0 5
## 434 0 3
## 435 1 1
## 436 0 5
## 437 0 2
## 438 1 1
## 439 1 1
## 440 1 1
## 441 1 1
## 442 0 5
## 443 1 1
## 444 1 1
## 445 1 1
## 446 1 1
## 447 0 5
## 448 1 1
## 449 1 1
## 450 0 5
## 451 0 5
## 452 0 3
## 453 1 4
## 454 0 2
## 455 1 1
## 456 1 1
## 457 1 1
## 458 0 2
## 459 1 1
## 460 1 1
## 461 1 1
## 462 1 1
## 463 1 1
## 464 0 3
## 465 1 1
## 466 0 2
## 467 0 2
## 468 0 5
## 469 1 1
## 470 1 1
## 471 1 1
## 472 0 2
## 473 0 5
## 474 1 1
## 475 0 5
## 476 1 1
## 477 1 4
## 478 1 1
## 479 1 1
## 480 0 3
## 481 1 1
## 482 1 1
## 483 1 1
## 484 1 1
## 485 0 5
## 486 1 1
## 487 1 1
## 488 1 1
## 489 1 1
## 490 1 1
## 491 1 1
## 492 0 5
## 493 0 5
## 494 1 1
## 495 1 1
## 496 0 5
## 497 1 1
## 498 1 1
## 499 1 1
## 500 1 1
## 501 1 1
## 502 0 3
## 503 0 3
## 504 1 1
## 505 1 1
## 506 1 1
## 507 0 5
## 508 0 2
## 509 0 5
## 510 1 1
## 511 0 5
## 512 0 5
## 513 1 1
## 514 1 4
## 515 0 2
## 516 1 1
## 517 1 4
## 518 1 1
## 519 1 1
## 520 1 1
## 521 1 1
## 522 1 4
## 523 1 1
## 524 1 1
## 525 1 1
## 526 0 2
## 527 0 5
## 528 0 5
## 529 1 1
## 530 0 5
## 531 0 5
## 532 1 4
## 533 1 1
## 534 1 1
## 535 1 1
## 536 1 1
## 537 1 1
## 538 0 3
## 539 1 1
## 540 0 3
## 541 1 1
## 542 1 1
## 543 1 1
## 544 0 3
## 545 0 5
## 546 0 3
## 547 1 1
## 548 1 4
## 549 0 5
## 550 1 1
## 551 0 5
## 552 0 3
## 553 1 1
## 554 0 5
## 555 1 1
## 556 1 1
## 557 1 4
## 558 1 1
## 559 1 1
## 560 1 1
## 561 0 5
## 562 1 1
## 563 1 1
## 564 0 3
## 565 1 4
## 566 0 5
## 567 0 5
## 568 0 5
## 569 1 1
## 570 0 5
## 571 1 1
## 572 1 1
## 573 0 5
## 574 0 5
## 575 1 1
## 576 0 5
## 577 0 3
## 578 0 5
## 579 0 5
## 580 1 4
## 581 0 5
## 582 1 1
## 583 1 4
## 584 1 4
## 585 1 1
## 586 0 2
## 587 0 5
## 588 1 1
## 589 0 3
## 590 1 4
## 591 1 4
## 592 1 4
## 593 1 1
## 594 1 1
## 595 1 4
## 596 0 3
## 597 1 1
## 598 1 1
## 599 0 3
## 600 1 4
## 601 0 5
## 602 1 1
## 603 0 5
## 604 1 1
## 605 1 1
## 606 1 1
## 607 0 5
## 608 1 4
## 609 1 4
## 610 0 2
## 611 1 1
## 612 1 1
## 613 1 1
## 614 1 1
## 615 1 1
## 616 0 5
## 617 1 1
## 618 1 1
## 619 1 1
## 620 1 1
## 621 0 3
## 622 1 4
## 623 1 1
## 624 1 4
## 625 1 1
## 626 0 5
## 627 1 1
## 628 0 5
## 629 1 4
## 630 1 4
## 631 0 2
## 632 0 3
## 633 1 4
## 634 1 1
## 635 0 3
## 636 1 1
## 637 1 4
## 638 1 1
## 639 1 1
## 640 1 1
## 641 0 2
## 642 1 4
## 643 0 5
## 644 1 1
## 645 0 5
## 646 1 4
## 647 1 1
## 648 0 5
## 649 1 1
## 650 0 5
## 651 0 5
## 652 1 4
## 653 0 5
## 654 1 4
## 655 1 4
## 656 0 5
## 657 0 3
## 658 0 2
## 659 0 5
## 660 1 4
## 661 1 1
## 662 0 3
## 663 1 1
## 664 0 5
## 665 0 5
## 666 0 5
## 667 0 5
## 668 1 1
## 669 1 4
## 670 0 2
## 671 1 1
## 672 1 1
## 673 0 5
## 674 0 3
## 675 1 4
## 676 0 5
## 677 0 3
## 678 1 4
## 679 1 1
## 680 1 1
## 681 1 1
## 682 0 5
## 683 1 1
## 684 0 3
## 685 0 5
## 686 0 3
## 687 1 1
## 688 0 3
## 689 0 3
## 690 1 1
## 691 1 1
## 692 0 5
## 693 0 5
## 694 1 1
## 695 1 1
## 696 1 1
## 697 1 1
## 698 1 1
## 699 1 4
## 700 1 1
## 701 1 4
## 702 1 1
## 703 1 1
## 704 1 1
## 705 1 1
## 706 0 5
## 707 0 3
## 708 1 4
## 709 1 1
## 710 1 1
## 711 1 4
## 712 0 2
## 713 1 1
## 714 0 5
## 715 1 1
## 716 0 5
## 717 0 5
## 718 0 3
## 719 1 4
## 720 0 5
## 721 1 4
## 722 1 1
## 723 1 4
## 724 0 3
## 725 1 1
## 726 1 1
## 727 1 1
## 728 0 2
## 729 1 4
## 730 1 4
## 731 0 2
## 732 1 4
## 733 0 2
## 734 0 5
## 735 1 4
## 736 0 3
## 737 1 4
## 738 1 4
## 739 1 1
## 740 0 5
## 741 0 3
## 742 1 1
## 743 0 3
## 744 1 1
## 745 0 5
## 746 0 3
## 747 1 4
## 748 1 1
## 749 1 4
## 750 1 4
## 751 0 5
## 752 1 1
## 753 0 3
## 754 1 4
## 755 1 1
## 756 1 1
## 757 1 1
## 758 1 1
## 759 1 1
## 760 1 1
## 761 0 5
## 762 0 5
## 763 1 1
## 764 1 1
## 765 1 1
## 766 1 1
## 767 0 3
## 768 0 3
## 769 1 1
## 770 0 5
## 771 0 5
## 772 1 1
## 773 0 5
## 774 1 1
## 775 1 1
## 776 0 5
## 777 1 1
## 778 0 2
## 779 1 1
## 780 1 1
## 781 1 4
## 782 1 1
## 783 1 1
## 784 1 4
## 785 1 1
## 786 0 5
## 787 1 1
## 788 1 1
## 789 0 3
## 790 0 2
## 791 1 1
## 792 0 5
## 793 1 1
## 794 0 2
## 795 1 1
## 796 0 3
## 797 1 1
## 798 0 2
## 799 1 1
## 800 0 2
## 801 1 4
## 802 1 1
## 803 1 1
## 804 0 3
## 805 1 1
## 806 1 1
## 807 1 1
## 808 1 1
## 809 0 5
## 810 0 3
## 811 1 1
## 812 0 2
## 813 0 3
## 814 0 2
## 815 1 1
## 816 1 4
## 817 1 1
## 818 1 1
## 819 0 2
## 820 0 5
## 821 0 5
## 822 0 3
## 823 0 5
## 824 1 1
## 825 0 5
## 826 1 1
## 827 1 1
## 828 1 4
## 829 1 1
## 830 0 3
## 831 1 1
## 832 0 3
## 833 1 1
## 834 1 1
## 835 0 5
## 836 1 1
## 837 1 1
## 838 1 4
## 839 0 5
## 840 0 5
## 841 0 5
## 842 1 4
## 843 1 4
## 844 1 4
## 845 0 3
## 846 0 5
## 847 1 1
## 848 1 1
## 849 0 5
## 850 1 1
## 851 0 3
## 852 1 4
## 853 1 1
## 854 1 4
## 855 1 1
## 856 1 1
## 857 0 5
## 858 1 1
## 859 1 1
## 860 0 3
## 861 1 1
## 862 1 1
## 863 1 1
## 864 1 1
## 865 1 1
## 866 0 5
## 867 0 2
## 868 0 5
## 869 0 3
## 870 0 3
## 871 1 1
## 872 1 1
## 873 0 5
## 874 1 1
## 875 1 1
## 876 0 3
## 877 1 1
## 878 1 1
## 879 1 1
## 880 0 3
## 881 0 5
## 882 1 1
## 883 1 1
## 884 0 5
## 885 1 1
## 886 1 1
## 887 1 1
## 888 1 1
## 889 0 5
## 890 1 4
## 891 1 1
## 892 0 3
## 893 0 5
## 894 0 5
## 895 1 1
## 896 0 5
## 897 1 1
## 898 1 1
## 899 0 3
## 900 0 3
## 901 1 1
## 902 1 4
## 903 1 1
## 904 0 5
## 905 0 5
## 906 1 1
## 907 1 1
## 908 1 4
## 909 1 4
## 910 1 1
## 911 0 2
## 912 1 1
## 913 1 1
## 914 1 1
## 915 0 2
## 916 1 1
## 917 0 5
## 918 1 1
## 919 0 2
## 920 1 1
## 921 0 2
## 922 1 1
## 923 1 1
## 924 1 1
## 925 1 1
## 926 0 5
## 927 1 1
## 928 1 1
## 929 0 2
## 930 1 1
## 931 1 1
## 932 1 1
## 933 1 1
## 934 1 1
## 935 1 1
## 936 0 3
## 937 1 1
## 938 1 1
## 939 1 1
## 940 0 5
## 941 1 1
## 942 1 1
## 943 1 1
## 944 1 1
## 945 0 3
## 946 1 1
## 947 1 1
## 948 1 4
## 949 1 4
## 950 1 4
## 951 0 2
## 952 1 1
## 953 0 5
## 954 0 3
## 955 1 1
## 956 1 4
## 957 0 3
## 958 0 5
## 959 0 2
## 960 0 2
## 961 1 1
## 962 1 4
## 963 1 4
## 964 1 4
## 965 1 1
## 966 0 5
## 967 1 4
## 968 1 1
## 969 1 1
## 970 0 3
## 971 1 4
## 972 1 1
## 973 0 5
## 974 0 5
## 975 0 3
## 976 1 1
## 977 1 1
## 978 1 1
## 979 1 4
## 980 1 1
## 981 0 3
## 982 1 1
## 983 1 1
## 984 1 1
## 985 0 2
## 986 0 5
## 987 1 1
## 988 1 1
## 989 1 1
## 990 0 3
## 991 0 3
## 992 1 4
## 993 0 2
## 994 1 4
## 995 0 5
## 996 0 2
## 997 1 4
## 998 1 1
## 999 0 2
## 1000 1 1
## 1001 1 4
## 1002 1 1
## 1003 0 5
## 1004 0 3
## 1005 0 3
## 1006 0 3
## 1007 1 1
## 1008 0 5
## 1009 0 2
## 1010 0 3
## 1011 1 1
## 1012 1 1
## 1013 1 4
## 1014 1 1
## 1015 1 4
## 1016 1 1
## 1017 0 5
## 1018 0 5
## 1019 1 4
## 1020 0 5
## 1021 0 5
## 1022 1 1
## 1023 0 2
## 1024 0 5
## 1025 1 1
## 1026 1 4
## 1027 0 5
## 1028 1 4
## 1029 1 4
## 1030 1 4
## 1031 1 1
## 1032 1 1
## 1033 1 1
## 1034 1 1
## 1035 1 4
## 1036 1 4
## 1037 0 3
## 1038 0 2
## 1039 0 3
## 1040 1 1
## 1041 1 1
## 1042 1 1
## 1043 1 1
## 1044 0 2
## 1045 0 3
## 1046 1 1
## 1047 0 5
## 1048 0 5
## 1049 0 3
## 1050 1 1
## 1051 0 5
## 1052 1 1
## 1053 1 1
## 1054 1 4
## 1055 1 1
## 1056 0 5
## 1057 1 1
## 1058 0 2
## 1059 1 4
## 1060 1 4
## 1061 0 5
## 1062 1 1
## 1063 1 1
## 1064 1 4
## 1065 0 3
## 1066 1 1
## 1067 0 5
## 1068 1 1
## 1069 0 5
## 1070 0 5
## 1071 1 1
## 1072 0 5
## 1073 1 1
## 1074 1 1
## 1075 1 4
## 1076 0 5
## 1077 1 1
## 1078 0 5
## 1079 1 1
## 1080 1 4
## 1081 1 4
## 1082 0 2
## 1083 1 4
## 1084 1 1
## 1085 1 1
## 1086 1 4
## 1087 0 5
## 1088 1 4
## 1089 1 1
## 1090 1 1
## 1091 1 4
## 1092 1 1
## 1093 1 4
## 1094 0 5
## 1095 0 5
## 1096 1 1
## 1097 1 4
## 1098 1 4
## 1099 0 3
## 1100 1 1
## 1101 1 1
## 1102 1 4
## 1103 1 4
## 1104 0 5
## 1105 1 4
## 1106 0 2
## 1107 0 5
## 1108 1 1
## 1109 0 5
## 1110 0 5
## 1111 1 1
## 1112 1 4
## 1113 1 4
## 1114 0 2
## 1115 1 1
## 1116 0 2
## 1117 1 4
## 1118 1 4
## 1119 0 5
## 1120 1 4
## 1121 1 1
## 1122 1 4
## 1123 0 5
## 1124 1 1
## 1125 0 5
## 1126 0 5
## 1127 1 4
## 1128 1 1
## 1129 1 4
## 1130 1 1
## 1131 1 4
## 1132 1 1
## 1133 0 3
## 1134 0 3
## 1135 1 4
## 1136 1 1
## 1137 1 4
## 1138 0 2
## 1139 0 5
## 1140 0 2
## 1141 1 4
## 1142 0 5
## 1143 1 1
## 1144 1 1
## 1145 1 1
## 1146 1 1
## 1147 0 3
## 1148 1 1
## 1149 0 5
## 1150 0 3
## 1151 1 1
## 1152 1 4
## 1153 1 1
## 1154 1 1
## 1155 1 1
## 1156 0 5
## 1157 0 3
## 1158 0 5
## 1159 0 5
## 1160 1 4
## 1161 0 2
## 1162 1 1
## 1163 0 5
## 1164 1 4
## 1165 1 4
## 1166 1 4
## 1167 1 4
## 1168 1 1
## 1169 1 4
## 1170 0 5
## 1171 1 4
## 1172 1 1
## 1173 1 4
## 1174 1 4
## 1175 1 1
## 1176 1 4
## 1177 0 3
## 1178 0 3
## 1179 1 4
## 1180 1 4
## 1181 1 4
## 1182 0 5
## 1183 1 1
## 1184 0 3
## 1185 0 2
## 1186 1 4
## 1187 0 2
## 1188 0 3
## 1189 1 4
## 1190 1 4
## 1191 1 1
## 1192 0 2
## 1193 0 2
## 1194 1 4
## 1195 0 3
## 1196 1 4
## 1197 0 5
## 1198 0 2
## 1199 0 3
## 1200 0 5
## 1201 1 4
## 1202 0 2
## 1203 1 4
## 1204 1 1
## 1205 1 4
## 1206 1 1
## 1207 1 4
## 1208 1 4
## 1209 0 5
## 1210 1 4
## 1211 1 4
## 1212 0 2
## 1213 1 4
## 1214 1 4
## 1215 1 4
## 1216 1 4
## 1217 1 4
## 1218 0 2
## 1219 1 4
## 1220 0 2
## 1221 1 4
## 1222 1 4
## 1223 0 2
## 1224 1 1
## 1225 0 2
## 1226 1 4
## 1227 1 4
## 1228 1 1
## 1229 1 4
## 1230 1 4
## 1231 0 3
## 1232 1 4
## 1233 1 1
## 1234 1 4
## 1235 1 4
## 1236 0 5
## 1237 1 1
## 1238 1 4
## 1239 1 1
## 1240 1 4
## 1241 1 4
## 1242 0 3
## 1243 1 1
## 1244 1 1
## 1245 1 1
## 1246 1 4
## 1247 1 1
## 1248 1 4
## 1249 1 4
## 1250 0 3
## 1251 1 4
## 1252 1 4
## 1253 1 4
## 1254 1 4
## 1255 1 1
## 1256 1 4
## 1257 0 3
## 1258 1 1
## 1259 0 3
## 1260 1 4
## 1261 1 1
## 1262 1 4
## 1263 1 4
## 1264 0 2
## 1265 1 4
## 1266 0 5
## 1267 1 1
## 1268 1 4
## 1269 1 1
## 1270 1 1
## 1271 0 3
## 1272 0 3
## 1273 0 5
## 1274 0 2
## 1275 1 4
## 1276 0 2
## 1277 0 3
## 1278 0 2
## 1279 0 3
## 1280 0 2
## 1281 1 4
## 1282 0 3
## 1283 1 1
## 1284 1 4
## 1285 0 5
## 1286 0 2
## 1287 0 2
## 1288 1 4
## 1289 1 4
## 1290 1 1
## 1291 0 2
## 1292 0 3
## 1293 1 1
## 1294 0 3
## 1295 1 1
## 1296 1 1
## 1297 0 2
## 1298 0 2
## 1299 1 4
## 1300 0 3
## 1301 1 4
## 1302 1 4
## 1303 1 4
## 1304 1 4
## 1305 1 4
## 1306 1 4
## 1307 1 1
## 1308 1 4
## 1309 0 5
## 1310 0 5
## 1311 0 3
## 1312 0 2
## 1313 1 4
## 1314 1 4
## 1315 1 4
## 1316 0 2
## 1317 1 4
## 1318 0 3
## 1319 0 2
## 1320 0 3
## 1321 1 4
## 1322 0 5
## 1323 1 1
## 1324 0 2
## 1325 1 4
## 1326 0 2
## 1327 1 1
## 1328 1 4
## 1329 0 3
## 1330 1 4
## 1331 1 1
## 1332 1 4
## 1333 1 4
## 1334 1 1
## 1335 1 1
## 1336 1 4
## 1337 1 4
## 1338 1 4
## 1339 1 1
## 1340 0 3
## 1341 0 2
## 1342 1 4
## 1343 0 3
## 1344 0 5
## 1345 0 2
## 1346 0 2
## 1347 0 2
## 1348 0 5
## 1349 0 2
## 1350 1 4
## 1351 0 3
## 1352 0 3
## 1353 1 4
## 1354 0 5
## 1355 1 4
## 1356 0 2
## 1357 1 4
## 1358 0 5
## 1359 1 4
## 1360 0 3
## 1361 1 4
## 1362 1 4
## 1363 1 1
## 1364 1 1
## 1365 0 5
## 1366 0 3
## 1367 0 5
## 1368 1 1
## 1369 0 5
## 1370 0 3
## 1371 1 1
## 1372 0 5
## 1373 1 4
## 1374 1 4
## 1375 0 3
## 1376 1 1
## 1377 0 5
## 1378 1 1
## 1379 0 2
## 1380 0 5
## 1381 1 4
## 1382 1 1
## 1383 1 4
## 1384 1 4
## 1385 1 4
## 1386 0 5
## 1387 1 4
## 1388 1 1
## 1389 0 2
## 1390 1 1
## 1391 1 1
## 1392 1 1
## 1393 0 3
## 1394 0 5
## 1395 1 1
## 1396 0 3
## 1397 1 4
## 1398 1 4
## 1399 0 5
## 1400 1 1
## 1401 1 4
## 1402 0 2
## 1403 0 2
## 1404 0 3
## 1405 0 3
## 1406 1 4
## 1407 0 3
## 1408 0 5
## 1409 0 2
## 1410 1 4
## 1411 1 4
## 1412 1 1
## 1413 1 4
## 1414 1 4
## 1415 0 5
## 1416 0 3
## 1417 0 3
## 1418 1 4
## 1419 1 4
## 1420 1 1
## 1421 1 4
## 1422 1 4
## 1423 1 1
## 1424 1 1
## 1425 1 4
## 1426 1 1
## 1427 1 1
## 1428 1 4
## 1429 1 4
## 1430 1 1
## 1431 1 1
## 1432 0 5
## 1433 1 4
## 1434 0 3
## 1435 0 3
## 1436 1 4
## 1437 1 1
## 1438 0 2
## 1439 1 1
## 1440 1 1
## 1441 1 4
## 1442 1 4
## 1443 1 1
## 1444 0 5
## 1445 1 4
## 1446 1 1
## 1447 0 3
## 1448 0 2
## 1449 1 4
## 1450 1 4
## 1451 0 2
## 1452 1 1
## 1453 1 1
## 1454 1 4
## 1455 1 1
## 1456 1 1
## 1457 0 3
## 1458 1 1
## 1459 1 1
## 1460 1 4
## 1461 0 3
## 1462 0 2
## 1463 1 1
## 1464 0 3
## 1465 0 5
## 1466 0 5
## 1467 0 3
## 1468 1 4
## 1469 0 2
## 1470 1 4
## 1471 0 5
## 1472 1 1
## 1473 1 1
## 1474 0 2
## 1475 1 4
## 1476 1 4
## 1477 1 1
## 1478 1 1
## 1479 1 4
## 1480 1 4
## 1481 1 4
## 1482 1 1
## 1483 0 5
## 1484 1 4
## 1485 0 3
## 1486 0 3
## 1487 1 4
## 1488 0 5
## 1489 0 3
## 1490 0 2
## 1491 0 5
## 1492 0 2
## 1493 1 1
## 1494 0 5
## 1495 1 1
## 1496 0 5
## 1497 1 1
## 1498 0 3
## 1499 0 5
## 1500 0 5
## 1501 1 1
## 1502 0 5
## 1503 1 1
## 1504 0 3
## 1505 0 5
## 1506 0 3
## 1507 1 1
## 1508 0 3
## 1509 1 1
## 1510 0 2
## 1511 0 5
## 1512 1 4
## 1513 1 4
## 1514 1 1
## 1515 1 1
## 1516 0 2
## 1517 1 4
## 1518 0 2
## 1519 1 4
## 1520 0 5
## 1521 0 2
## 1522 1 4
## 1523 0 2
## 1524 1 1
## 1525 1 4
## 1526 1 1
## 1527 0 5
## 1528 1 4
## 1529 0 2
## 1530 0 3
## 1531 1 1
## 1532 1 4
## 1533 0 2
## 1534 1 4
## 1535 1 4
## 1536 1 4
## 1537 1 4
## 1538 0 5
## 1539 0 2
## 1540 1 4
## 1541 0 2
## 1542 0 5
## 1543 0 2
## 1544 1 1
## 1545 1 4
## 1546 1 1
## 1547 1 4
## 1548 1 4
## 1549 1 4
## 1550 0 3
## 1551 1 1
## 1552 0 3
## 1553 1 4
## 1554 0 5
## 1555 1 4
## 1556 0 5
## 1557 1 1
## 1558 1 4
## 1559 1 1
## 1560 1 1
## 1561 1 1
## 1562 1 1
## 1563 1 1
## 1564 0 2
## 1565 0 5
## 1566 1 4
## 1567 0 3
## 1568 1 1
## 1569 0 3
## 1570 1 4
## 1571 0 5
## 1572 0 3
## 1573 0 2
## 1574 1 4
## 1575 1 1
## 1576 1 1
## 1577 1 1
## 1578 1 1
## 1579 0 3
## 1580 0 2
## 1581 1 1
## 1582 1 1
## 1583 1 1
## 1584 1 1
## 1585 1 4
## 1586 1 4
## 1587 1 4
## 1588 1 4
## 1589 1 1
## 1590 1 4
## 1591 1 4
## 1592 1 4
## 1593 1 4
## 1594 1 4
## 1595 1 4
## 1596 1 4
## 1597 1 1
## 1598 1 1
## 1599 1 4
## 1600 1 4
## 1601 1 4
## 1602 1 1
## 1603 1 1
## 1604 1 1
## 1605 1 4
## 1606 1 4
## 1607 1 4
## 1608 1 1
## 1609 1 4
## 1610 1 1
## 1611 1 4
## 1612 1 4
## 1613 1 4
## 1614 1 1
## 1615 1 1
## 1616 1 1
## 1617 1 4
## 1618 1 4
## 1619 1 4
## 1620 1 4
## 1621 1 1
## 1622 1 4
## 1623 1 1
## 1624 1 4
## 1625 1 1
## 1626 1 4
## 1627 1 4
## 1628 1 1
## 1629 1 4
## 1630 1 4
## 1631 1 4
## 1632 1 4
## 1633 1 4
## 1634 1 4
## 1635 1 1
## 1636 1 1
## 1637 1 4
## 1638 1 4
## 1639 1 4
## 1640 1 4
## 1641 1 4
## 1642 1 4
## 1643 1 4
## 1644 1 4
## 1645 1 4
## 1646 1 1
## 1647 1 4
## 1648 1 4
## 1649 1 4
## 1650 1 1
## 1651 1 4
## 1652 1 1
## 1653 1 1
## 1654 1 1
## 1655 1 4
## 1656 1 1
## 1657 1 1
## 1658 1 4
## 1659 1 1
## 1660 1 4
## 1661 1 4
## 1662 1 4
## 1663 1 4
## 1664 1 1
## 1665 1 4
## 1666 1 1
## 1667 1 1
## 1668 1 4
## 1669 1 4
## 1670 1 1
## 1671 1 4
## 1672 1 4
## 1673 1 1
## 1674 1 4
## 1675 1 4
## 1676 1 4
## 1677 1 1
## 1678 1 4
## 1679 1 4
## 1680 1 4
## 1681 1 4
## 1682 1 4
## 1683 1 4
## 1684 1 4
## 1685 1 4
## 1686 1 4
## 1687 1 4
## 1688 1 4
## 1689 1 4
## 1690 1 4
## 1691 1 1
## 1692 1 4
## 1693 1 4
## 1694 1 4
## 1695 1 4
## 1696 1 4
## 1697 1 1
## 1698 1 4
## 1699 1 1
## 1700 1 4
## 1701 1 1
## 1702 1 4
## 1703 1 4
## 1704 1 4
## 1705 1 4
## 1706 1 4
## 1707 1 4
## 1708 1 4
## 1709 1 4
## 1710 1 4
## 1711 1 4
## 1712 1 4
## 1713 1 4
## 1714 1 1
## 1715 1 1
## 1716 1 4
## 1717 1 4
## 1718 1 4
## 1719 1 4
## 1720 1 4
## 1721 1 4
## 1722 1 4
## 1723 1 4
## 1724 1 4
## 1725 1 1
## 1726 1 4
## 1727 1 4
## 1728 1 4
## 1729 1 4
## 1730 1 4
## 1731 1 4
## 1732 1 4
## 1733 1 1
## 1734 1 4
## 1735 1 4
## 1736 1 1
## 1737 1 4
## 1738 1 4
## 1739 1 4
## 1740 1 1
## 1741 1 4
## 1742 1 1
## 1743 1 4
## 1744 1 1
## 1745 1 4
## 1746 1 1
## 1747 1 4
## 1748 1 4
## 1749 1 4
## 1750 1 1
## 1751 1 4
## 1752 1 4
## 1753 1 4
## 1754 1 1
## 1755 1 4
## 1756 1 1
## 1757 1 4
## 1758 1 1
## 1759 1 4
## 1760 1 4
## 1761 1 1
## 1762 1 1
## 1763 1 4
## 1764 1 4
## 1765 1 4
## 1766 1 4
## 1767 1 4
## 1768 1 1
## 1769 1 4
## 1770 1 4
## 1771 1 4
## 1772 1 4
## 1773 1 4
## 1774 1 1
## 1775 1 4
## 1776 1 1
## 1777 1 1
## 1778 1 4
## 1779 1 4
## 1780 1 4
## 1781 1 1
## 1782 1 1
## 1783 1 4
## 1784 1 1
## 1785 1 4
## 1786 1 4
## 1787 1 1
## 1788 1 4
## 1789 1 1
## 1790 1 4
## 1791 1 4
## 1792 1 4
## 1793 1 4
## 1794 1 1
## 1795 1 4
## 1796 1 4
## 1797 1 4
## 1798 1 4
## 1799 1 4
## 1800 1 1
## 1801 1 4
## 1802 1 4
## 1803 1 4
## 1804 1 4
## 1805 1 4
## 1806 1 1
## 1807 1 4
## 1808 1 4
## 1809 1 1
## 1810 1 4
## 1811 1 1
## 1812 1 1
## 1813 1 4
## 1814 1 4
## 1815 1 4
## 1816 1 4
## 1817 1 1
## 1818 1 4
## 1819 1 4
## 1820 1 4
## 1821 1 1
## 1822 1 4
## 1823 1 4
## 1824 1 4
## 1825 1 1
## 1826 1 4
## 1827 1 4
## 1828 1 1
## 1829 1 4
## 1830 1 4
## 1831 1 4
## 1832 1 1
## 1833 1 4
## 1834 1 4
## 1835 1 1
## 1836 1 4
## 1837 1 1
## 1838 1 1
## 1839 1 1
## 1840 1 4
## 1841 1 4
## 1842 1 1
## 1843 1 1
## 1844 1 1
## 1845 1 4
## 1846 1 1
## 1847 1 4
## 1848 1 1
## 1849 1 4
## 1850 1 1
## 1851 1 1
## 1852 1 1
## 1853 1 4
## 1854 1 4
## 1855 1 4
## 1856 1 4
## 1857 1 4
## 1858 1 4
## 1859 1 1
## 1860 1 4
## 1861 1 4
## 1862 1 4
## 1863 1 4
## 1864 1 4
## 1865 1 4
## 1866 1 4
## 1867 1 4
## 1868 1 4
## 1869 1 4
## 1870 1 4
## 1871 1 1
## 1872 1 4
## 1873 1 1
## 1874 1 4
## 1875 1 1
## 1876 1 4
## 1877 1 1
## 1878 1 4
## 1879 1 4
## 1880 1 4
## 1881 1 4
## 1882 1 4
## 1883 1 4
## 1884 1 1
## 1885 1 4
## 1886 1 4
## 1887 1 4
## 1888 1 4
## 1889 1 4
## 1890 1 4
## 1891 1 4
## 1892 1 4
## 1893 1 4
## 1894 1 1
## 1895 1 1
## 1896 1 4
## 1897 1 1
## 1898 1 4
## 1899 1 1
## 1900 1 4
## 1901 1 4
## 1902 1 4
## 1903 1 4
## 1904 1 4
## 1905 1 4
## 1906 1 4
## 1907 1 4
## 1908 1 4
## 1909 1 4
## 1910 1 4
## 1911 1 4
## 1912 1 1
## 1913 1 4
## 1914 1 1
## 1915 1 4
## 1916 1 4
## 1917 1 1
## 1918 1 4
## 1919 1 4
## 1920 1 4
## 1921 1 1
## 1922 1 1
## 1923 1 4
## 1924 1 4
## 1925 1 1
## 1926 1 1
## 1927 1 4
## 1928 1 4
## 1929 1 4
## 1930 1 4
## 1931 1 4
## 1932 1 1
## 1933 1 1
## 1934 1 4
## 1935 1 1
## 1936 1 4
## 1937 1 4
## 1938 1 4
## 1939 1 4
## 1940 1 4
## 1941 1 4
## 1942 1 4
## 1943 1 1
## 1944 1 4
## 1945 1 4
## 1946 1 4
## 1947 1 4
## 1948 1 4
## 1949 1 1
## 1950 1 4
## 1951 1 4
## 1952 1 4
## 1953 1 4
## 1954 1 4
## 1955 1 1
## 1956 1 1
## 1957 1 1
## 1958 1 4
## 1959 1 4
## 1960 1 4
## 1961 1 4
## 1962 1 4
## 1963 1 4
## 1964 1 1
## 1965 1 4
## 1966 1 4
## 1967 1 4
## 1968 1 1
## 1969 1 1
## 1970 1 4
## 1971 1 4
## 1972 1 1
## 1973 1 4
## 1974 1 4
## 1975 1 4
## 1976 1 1
## 1977 1 4
## 1978 1 1
## 1979 1 4
## 1980 1 4
## 1981 1 4
## 1982 1 1
## 1983 1 4
## 1984 1 4
## 1985 1 4
## 1986 1 4
## 1987 1 1
## 1988 1 4
## 1989 1 4
## 1990 1 4
## 1991 1 4
## 1992 1 4
## 1993 1 1
## 1994 1 4
## 1995 1 4
## 1996 1 4
## 1997 1 4
## 1998 1 4
## 1999 1 4
## 2000 1 1
## 2001 1 1
## 2002 1 4
## 2003 1 1
## 2004 1 4
## 2005 1 1
## 2006 1 4
## 2007 1 4
## 2008 1 1
## 2009 1 4
## 2010 1 4
## 2011 1 1
## 2012 1 4
## 2013 1 1
## 2014 1 4
## 2015 1 1
## 2016 1 1
## 2017 1 4
## 2018 1 1
## 2019 1 4
## 2020 1 1
## 2021 1 1
## 2022 1 1
## 2023 1 1
## 2024 1 4
## 2025 1 1
## 2026 1 1
## 2027 1 4
## 2028 1 4
## 2029 1 4
## 2030 1 4
## 2031 1 4
## 2032 1 4
## 2033 1 1
## 2034 1 4
## 2035 1 1
## 2036 1 1
## 2037 1 1
## 2038 1 4
## 2039 1 1
## 2040 1 4
## 2041 1 1
## 2042 1 4
## 2043 1 4
## 2044 1 1
## 2045 1 1
## 2046 1 1
## 2047 1 4
## 2048 1 4
## 2049 1 1
## 2050 1 4
## 2051 1 1
## 2052 1 1
## 2053 1 4
## 2054 1 1
## 2055 1 1
## 2056 1 4
## 2057 1 4
## 2058 1 1
## 2059 1 1
## 2060 1 1
## 2061 1 1
## 2062 1 1
## 2063 1 1
## 2064 1 1
#############################################
### 9. CLUSTER CENTROIDS FOR INTERPRETATION
#############################################
cluster_centroids <- ryanair_features %>%
group_by(cluster_new) %>%
summarise(
Avg_Price = mean(Value.For.Money),
Avg_Comfort = mean(Seat.Comfort),
Avg_Cabin = mean(Cabin.Staff.Service),
Avg_Ground = mean(Ground.Service),
Avg_Food = mean(Food...Beverages),
Avg_Wifi = mean(Wifi...Connectivity),
Avg_Ent = mean(Inflight.Entertainment),
Short_pct = mean(DurationCatShort) * 100,
Medium_pct = mean(DurationCatMedium) * 100,
Long_pct = mean(DurationCatLong) * 100,
count = n()
)
cluster_centroids
## # A tibble: 5 x 12
## cluster_new Avg_Price Avg_Comfort Avg_Cabin Avg_Ground Avg_Food Avg_Wifi
## <int> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
## 1 1 1.61 1.65 1.90 1.17 1.60 0.162
## 2 2 4.44 3.29 4.26 3.82 2.69 0.171
## 3 3 2.55 2.11 2.73 2.24 2.19 0.179
## 4 4 4.53 3.56 4.08 2.37 2.48 0.0401
## 5 5 1.52 1.45 1.80 1.27 1.68 0.267
## # i 5 more variables: Avg_Ent <dbl>, Short_pct <dbl>, Medium_pct <dbl>,
## # Long_pct <dbl>, count <int>
#############################################
### 10. CLUSTER OVERALL RATING
#############################################
cluster_overall <- ryanair_features %>%
group_by(cluster_new) %>%
summarise(
Avg_Overall = mean(Overall.Rating, na.rm = TRUE),
count = n()
)
cluster_overall
## # A tibble: 5 x 3
## cluster_new Avg_Overall count
## <int> <dbl> <int>
## 1 1 1.83 776
## 2 2 7.71 140
## 3 3 3.98 190
## 4 4 7.97 673
## 5 5 1.59 285
############################################################
# 1. LOAD AFINN SENTIMENT LEXICON
############################################################
afinn <- read.csv(
"https://raw.githubusercontent.com/fnielsen/afinn/master/afinn/data/AFINN-en-165.txt",
sep = "\t", header = FALSE,
col.names = c("word", "value")
)
############################################################
# 2. COMBINE REVIEW TITLE + REVIEW DESCRIPTION
############################################################
ryanair_features$full_review <- paste(
ryanair_features$Comment.title,
ryanair_features$Comment,
sep = " "
)
############################################################
# 3. TOKENIZATION + CLEANING
############################################################
# Tokenize function
tokenize <- function(text) {
tolower(unlist(strsplit(text, "\\W+")))
}
# Apply tokenizer
tokens_raw <- lapply(ryanair_features$full_review, tokenize)
# Trim whitespace
tokens_clean <- lapply(tokens_raw, function(w) trimws(w))
# Remove punctuation including unicode
tokens_clean <- lapply(tokens_clean, function(w) gsub("[[:punct:]]", "", w))
# Remove empty strings
tokens_clean <- lapply(tokens_clean, function(w) w[w != ""])
############################################################
# 4. DEFINE STOPWORDS (ENGLISH + DOMAIN WORDS)
############################################################
custom_stopwords <- c(
# Common English stopwords
"the","to","and","i","a","was","in","for","of","we","on","with","they","that",
"it","not","you","my","at","is","this","had","have","but","as","t","our","from",
"their","be","so","are","were","by","or","an","if","there","me","would","could",
"just","when","then","very","which","he","she","his","her","never","about","other",
"can","up","2","out","experience","told","after","what","than","because","your",
"people","did","been","off","got","didn","like","flying","board","another","first",
"way","3","don","take","who","made","asked","go","same","really","now","flights",
"some","company","two","both","due","make","last","through","use","said","5","next",
"has","charge","am","much","flew","1","however","being","went","left","without","pass",
"hand","too","ve","many","should","30","each","know","10","20","times","new","tried", "nothing",
"into","55","took","most","need","everything","how","put","where","why","say","going","always",
"change","once","4","give","print","couldn","find","want","together","having","enough","m",
"since","though","home","until",
# Domain stopwords
"ryanair","flight","airline","no","all","us","them","get","will","plane","one",
"s","only","customer","more","do","before","fly","again","airport",
"ever","every","any","still","even","also","back",
# Contraction leftovers
"don","cant","wont","doesnt","didnt","isnt","shouldnt","wouldnt","couldnt",
# Empty tokens
"", " "
)
############################################################
# 5. REMOVE STOPWORDS
############################################################
filtered_tokens <- lapply(
tokens_clean,
function(w) w[!w %in% custom_stopwords]
)
############################################################
# 6. SENTIMENT SCORE (AFINN)
############################################################
ryanair_features$sentiment_score <- sapply(
filtered_tokens,
function(words) {
matched <- afinn$value[match(words, afinn$word)]
sum(matched, na.rm = TRUE)
}
)
############################################################
# 7. DEFINE GROUPED CATEGORIES (MANUAL LEXICON)
############################################################
keyword_map <- list(
seating = c("seat","seats","sit"),
baggage = c("bag","bags","luggage","cabin","checked","small","check","checking"),
punctuality = c("delayed","late", "delay","early","later","time"),
waiting = c("wait","waiting","long","line", "queue","hour","hours","minutes"),
cost = c("extra","paid","cost","money","over","price","cheap","euros","charged","fee","fine","pay"),
boarding = c("boarding","gate","priority","departure"),
bad_service = c("worst","rude","service","bad","terrible"),
stansted = c("stansted","london")
)
############################################################
# 8. CATEGORY MAPPING FUNCTION
# → category words become their category
# → other words remain themselves (NOT NA)
############################################################
assign_category <- function(word) {
for (cat in names(keyword_map)) {
if (word %in% keyword_map[[cat]]) {
return(cat) # grouped category
}
}
return(word) # keep original word instead of NA
}
############################################################
# 9. APPLY CATEGORY MAPPING
############################################################
categorized_tokens <- lapply(
filtered_tokens,
function(words) sapply(words, assign_category)
)
############################################################
# 10. FREQUENCY TABLE (CATEGORIES + RAW WORDS)
############################################################
all_words_or_categories <- unlist(categorized_tokens)
word_freq_final <- sort(table(all_words_or_categories), decreasing = TRUE)
# Show top 50
print(head(word_freq_final, 50))
## all_words_or_categories
## cost baggage punctuality waiting boarding bad_service
## 4114 3982 2499 2321 2011 1658
## seating staff crew stansted review good
## 1498 897 721 661 601 472
## return passengers online \302 arrived friendly
## 465 432 405 381 341 297
## booked ticket aircraft dublin \342 food
## 293 287 286 285 276 248
## well booking airlines day travel tickets
## 247 229 228 226 212 211
## trip free low refund days front
## 210 206 206 206 205 205
## problem great help website customers book
## 205 198 191 185 183 182
## passes flown better rules desk few
## 182 181 180 179 167 162
## manchester around
## 162 157
############################################################
# 10. WORDCLOUD VISUALIZATION
############################################################
# install.packages("wordcloud")
library(wordcloud)
## Warning: package 'wordcloud' was built under R version 4.5.2
## Loading required package: RColorBrewer
# Capitalize words
words_cap <- tools::toTitleCase(names(word_freq_final))
# Create a WIDE 16:9 word cloud
#png("wordcloud_wide_16x9.png", width = 1600, height = 900, res = 150)
par(mar = c(0, 0, 0, 0)) # remove margins entirely
par(pty = "m") # force plotting to fill the device
wordcloud(
words = words_cap,
freq = as.numeric(word_freq_final),
max.words = 150,
rot.per = 0.1,
random.order = FALSE,
scale = c(5, 0.8), # wider scaling range
colors = c("#003399", "#F4CA35"),
family = "Arial"
)
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Uncomfortable could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Travelling could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Excellent could not be fit on page. It will not be plotted.
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : font family not found in Windows font database
## Warning in strwidth(words[i], cex = size[i], ...): font family not found in
## Windows font database
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Landing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Legroom could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Understand could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Holiday could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Member could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Absolutely could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Business could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Actually could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = words_cap, freq = as.numeric(word_freq_final), :
## Expensive could not be fit on page. It will not be plotted.
#dev.off()