Loadings in previous EDAs have been hide away. We should notice that
our output DF does not incorporate the other two raw data
frames, namely, df_brand_tags and df_projects.
However, both three have common keys in project_id, we
should consider joining them for being more informative. Notice that we
discard the fourth column in df_projects since it is just a
duplicate of project_id. Something we should notice is that
df_projects is a very small data frame compared to
DF, though by merging it, our customer-centric panel data
will become enormously larger since there will be a lot of duplicated
rows in redemption and revenue view tables. Also,
df_projects contain only character types of
information, and almost all columns they present are in fact already
included in our previous DF. We will not combine
df_projects given this reason. df_brand_tags
is also small, but it contains more advanced features on projects. Such
information is not related to our customer-centric panel data, but may
be informative for item innate factors. We will leave that sort of
information in the Appendix of Reconciliation Analysis
II by building a project-centric data frame to complement our
customer-centric panel data.
df_projects <- df_projects[, -4]
head(df_projects)
## project_id project_name project_location_id
## V1 11 Pluma by Bluebird Bakery 2653
## V2 11 Pluma by Bluebird Bakery 5026
## V3 20 Prequel 2 2818
## V4 39 Morris 2886
## V5 42 Prequel DC 95
## V6 42 Prequel DC 136
## address city state zip_code latitude longitude
## V1 391 Norse St NE Washington DC 20002 38.907829 -77.0004642
## V2 900 19th St NW Washington DC 20006 38.9016559 -77.0438082
## V3 918 F St NW, Washington, DC Washington DC 20004 38.897 -77.0249
## V4 N.W., Washington, D.C Washington DC 20001 38.912068 -77.0190228
## V5 919 19th St NW Washington DC 20006 38.9017672 -77.0431844
## V6 918 F St NW Washington DC 20004 38.897 -77.0249
## project_location_name created_at timezone_name
## V1 Pluma by Bluebird Bakery 2021-05-06 02:08:00 America/New_York
## V2 Flora Pizzeria 2022-12-28 20:16:27 America/New_York
## V3 Prequel 2 2021-05-06 02:08:00 America/New_York
## V4 Morris 2021-05-06 02:08:00 America/New_York
## V5 Prequel 2019-07-12 23:55:56 America/New_York
## V6 Prequel other 2020-02-19 16:51:30 America/New_York
dim(df_projects)
## [1] 925 12
df_brand_tags <- transform(df_brand_tags,
tag = as.factor(tag),
tag_category = as.factor(tag_category),
category_desc = as.factor(category_desc),
is_featured = as.factor(is_featured),
longitude = as.character(longitude),
latitude = as.character(latitude))
head(df_brand_tags)
## name project_id project_location_id project_location_name tag
## V1 Sheesh 249 88 Sheesh - Chantilly Casual
## V2 Sheesh 249 88 Sheesh - Chantilly Mediterranean
## V3 Sheesh 249 88 Sheesh - Chantilly Halal
## V4 Sheesh 249 89 Sheesh - Mosaic Halal
## V5 Sheesh 249 89 Sheesh - Mosaic Casual
## V6 Sheesh 249 89 Sheesh - Mosaic Mediterranean
## tag_category category_desc is_featured address
## V1 3 mood 1 13940 Lee Jackson Memorial Hwy
## V2 2 cuisine_type 1 13940 Lee Jackson Memorial Hwy
## V3 2 cuisine_type 1 13940 Lee Jackson Memorial Hwy
## V4 2 cuisine_type 1 8190 Strawberry Ln, Ste 4
## V5 3 mood 1 8190 Strawberry Ln, Ste 4
## V6 2 cuisine_type 1 8190 Strawberry Ln, Ste 4
## longitude latitude city state created_at
## V1 -77.4288925 38.8944359 Chantilly VA 2019-04-10 17:11:48
## V2 -77.4288925 38.8944359 Chantilly VA 2019-04-10 17:11:48
## V3 -77.4288925 38.8944359 Chantilly VA 2019-04-10 17:11:48
## V4 -77.2282915 38.8727605 Falls Church VA 2019-04-10 17:12:37
## V5 -77.2282915 38.8727605 Falls Church VA 2019-04-10 17:12:37
## V6 -77.2282915 38.8727605 Falls Church VA 2019-04-10 17:12:37
dim(df_brand_tags)
## [1] 1821 14
Hence, we will simply continue the work from EDA VIII [1].
In EDA VIII [1], we have created cumsum_ columns for all
numeric variables, and it turns out that those expanded factors do not
necessarily need their corresponding cumulative sums. Hence, we will
remove them here before the next-step analyses.
cumsum_cols <- grep("^cumsum_", names(PDF_daily_impute_cumulated), value = TRUE)
cols_to_keep <- c("cumsum_total_redemption_amount", "cumsum_tip",
"cumsum_amount_charged_in_usd", "cumsum_credit_given_in_usd")
cols_to_remove <- setdiff(cumsum_cols, cols_to_keep)
PDF_daily_impute_cumulated <-
PDF_daily_impute_cumulated[ , !(names(PDF_daily_impute_cumulated) %in% cols_to_remove)]
PDF_daily_impute_cumulated
## # A tibble: 322,551 × 68
## # Groups: user_id [106,091]
## user_id created_at total_redemption_amount cumsum_total_redemption_am…¹ tip
## <fct> <fct> <dbl> <dbl> <dbl>
## 1 100001 2022-04-22 0 0 0
## 2 100002 2022-04-22 126. 126. 20.7
## 3 100002 2022-04-23 0 126. 0
## 4 100003 2022-04-22 292. 292. 58.4
## 5 100003 2022-04-22 0 292. 0
## 6 100003 2022-04-23 0 292. 0
## 7 100005 2022-04-22 68.2 68.2 15.8
## 8 100005 2023-01-09 49.8 118 2
## 9 100005 2023-01-09 0 118 0
## 10 100007 2022-04-23 0 0 0
## # ℹ 322,541 more rows
## # ℹ abbreviated name: ¹cumsum_total_redemption_amount
## # ℹ 63 more variables: cumsum_tip <dbl>, amount_charged_in_usd <dbl>,
## # cumsum_amount_charged_in_usd <dbl>, credit_given_in_usd <dbl>,
## # cumsum_credit_given_in_usd <dbl>, Venue.Type...Detail_Bar <int>,
## # Venue.Type...Detail_Cafe <int>, `Venue.Type...Detail_Casual Dining` <int>,
## # `Venue.Type...Detail_Casual Fine Dining` <int>, …
Our EDA VIII does not consider missing entries in those
character types of columns. However, by looking at them,
some missing entries are in fact due to incomplete merging. For example,
project.name and name should constitute a
complete column without missing entries. In the merged column, which is
named as project_name, for each row, if the
project.name value is missing, we will fill it with the
corresponding value from the name column.
PDF_daily_impute_cumulated[, c(49:68)]
## # A tibble: 322,551 × 20
## project_id project.name Location project_location_id city state
## <chr> <chr> <chr> <chr> <chr> <chr>
## 1 695 <NA> <NA> <NA> <NA> <NA>
## 2 676 50 Eggs Hospitality Group Yardbir… 2620 Wash… DC
## 3 676 <NA> <NA> <NA> <NA> <NA>
## 4 185 The Ravenous Pig The Rav… 2649 Wint… FL
## 5 185 <NA> <NA> <NA> <NA> <NA>
## 6 185 <NA> <NA> <NA> <NA> <NA>
## 7 692 Thunderdome Restaurant G… The Eag… 2573 Char… NC
## 8 692 Thunderdome Restaurant G… The Eag… 2573 Char… NC
## 9 692 <NA> <NA> <NA> <NA> <NA>
## 10 695 <NA> <NA> <NA> <NA> <NA>
## # ℹ 322,541 more rows
## # ℹ 14 more variables: credit_transaction_id <chr>, UID <chr>, name <chr>,
## # gcp_id <chr>, ict_id <chr>, utm_campaign <chr>, utm_medium <chr>,
## # utm_content <chr>, utm_source <chr>, option_id <chr>,
## # account_created_at <date>, zip_code <chr>, user_app_version <chr>,
## # user_app_platform <chr>
PDF_daily_impute_cumulated$project_name <-
ifelse(is.na(PDF_daily_impute_cumulated$`project.name`),
PDF_daily_impute_cumulated$name,
PDF_daily_impute_cumulated$`project.name`)
PDF_daily_impute_cumulated$`project.name` <- NULL
PDF_daily_impute_cumulated$name <- NULL
PDF_daily_impute_cumulated[, c(49:67)]
## # A tibble: 322,551 × 19
## project_id Location project_location_id city state credit_transaction_id
## <chr> <chr> <chr> <chr> <chr> <chr>
## 1 695 <NA> <NA> <NA> <NA> <NA>
## 2 676 Yardbird - … 2620 Wash… DC 461584
## 3 676 <NA> <NA> <NA> <NA> <NA>
## 4 185 The Ravenou… 2649 Wint… FL 461659
## 5 185 <NA> <NA> <NA> <NA> <NA>
## 6 185 <NA> <NA> <NA> <NA> <NA>
## 7 692 The Eagle -… 2573 Char… NC 461651
## 8 692 The Eagle -… 2573 Char… NC 699717
## 9 692 <NA> <NA> <NA> <NA> <NA>
## 10 695 <NA> <NA> <NA> <NA> <NA>
## # ℹ 322,541 more rows
## # ℹ 13 more variables: UID <chr>, gcp_id <chr>, ict_id <chr>,
## # utm_campaign <chr>, utm_medium <chr>, utm_content <chr>, utm_source <chr>,
## # option_id <chr>, account_created_at <date>, zip_code <chr>,
## # user_app_version <chr>, user_app_platform <chr>, project_name <chr>
The merged column project_name has been created on the
last column. We will reorder everything when we are done with other
reshapes. Next, we notice that some columns, say Location,
project_location_id, city, and
state have some missing values, and a deeper look will
immediately let us know that they are also due to the tabular merging
problem. However, with project_id and user_id,
we can easily input these redemption-related data into
transaction-related data. Such a data frame is stored as
PDF_daily_impute_char_cumulated below.
impute_cols <- c("Location", "project_location_id", "city", "state")
PDF_daily_impute_char_cumulated <-
PDF_daily_impute_cumulated |> arrange(user_id, project_id)
PDF_daily_impute_char_cumulated <-
PDF_daily_impute_char_cumulated |>
group_by(user_id, project_id) |> fill(impute_cols, .direction = "downup")
## Warning: Using an external vector in selections was deprecated in tidyselect 1.1.0.
## ℹ Please use `all_of()` or `any_of()` instead.
## # Was:
## data %>% select(impute_cols)
##
## # Now:
## data %>% select(all_of(impute_cols))
##
## See <https://tidyselect.r-lib.org/reference/faq-external-vector.html>.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
PDF_daily_impute_char_cumulated[, c(49:67)]
## # A tibble: 322,551 × 19
## # Groups: project_id [168]
## project_id Location project_location_id city state credit_transaction_id
## <chr> <chr> <chr> <chr> <chr> <chr>
## 1 695 <NA> <NA> <NA> <NA> <NA>
## 2 676 Yardbird - … 2620 Wash… DC 461584
## 3 676 Yardbird - … 2620 Wash… DC <NA>
## 4 185 The Ravenou… 2649 Wint… FL 461659
## 5 185 The Ravenou… 2649 Wint… FL <NA>
## 6 185 The Ravenou… 2649 Wint… FL <NA>
## 7 692 The Eagle -… 2573 Char… NC 461651
## 8 692 The Eagle -… 2573 Char… NC 699717
## 9 692 The Eagle -… 2573 Char… NC <NA>
## 10 695 <NA> <NA> <NA> <NA> <NA>
## # ℹ 322,541 more rows
## # ℹ 13 more variables: UID <chr>, gcp_id <chr>, ict_id <chr>,
## # utm_campaign <chr>, utm_medium <chr>, utm_content <chr>, utm_source <chr>,
## # option_id <chr>, account_created_at <date>, zip_code <chr>,
## # user_app_version <chr>, user_app_platform <chr>, project_name <chr>
diff, cumsum_diff
columnsWe will define transaction in marketing as the money spent by a customer to purchase a product or service. Redemption, on the other hand, is the act of using coupons, discounts, or rewards to reduce the total amount owed or obtain a discount on a purchase. On the side of customers, transaction is the process of spending their money, while redemption is the process of using their monetary values (i.e. coupons). Typically, the amount of redemption is less than or equal to transaction, and this is consider to be a valid case. However, we would expect to see many violated cases.
Then, we will mutate a new numeric column as well as its cumulative
format - “difference” column, which is defined as diff :=
credit_given_in_usd - amount_charged_in_usd.
Notice that this added variable will be meaningful in our later dynamic
relationship explorations.
PDF_daily_impute_char_cumulated <-
mutate(PDF_daily_impute_char_cumulated,
diff = credit_given_in_usd - amount_charged_in_usd,
cumsum_diff = cumsum_credit_given_in_usd - cumsum_amount_charged_in_usd)
In this section, we follow the reordering technique from EDA VIII [1]. The order is given by:
user_id,
project_id, created_at)diff and
cumsum_diff)project_namecharacter types of columnsnumeric_cols_new <- c("total_redemption_amount", "amount_charged_in_usd",
"credit_given_in_usd", "diff", "tip",
"cumsum_total_redemption_amount", "cumsum_amount_charged_in_usd",
"cumsum_credit_given_in_usd", "cumsum_diff", "cumsum_tip")
expanded_factor_cols <- c(grep("^Venue.Type", names(PDF_daily_impute), value = TRUE),
grep("^Check.Average", names(PDF_daily_impute), value = TRUE),
grep("^Service.Type", names(PDF_daily_impute), value = TRUE),
grep("^is_app_purchase", names(PDF_daily_impute), value = TRUE),
grep("^transaction_type", names(PDF_daily_impute), value = TRUE),
grep("^credit_type", names(PDF_daily_impute), value = TRUE),
grep("^is_excess", names(PDF_daily_impute), value = TRUE),
grep("^stripe_brand", names(PDF_daily_impute), value = TRUE))
char_cols <- setdiff(other_cols, c("project.name", "name", "project_id"))
index_group_cols <- c("user_id", "project_id", "created_at")
PDF_daily_impute_char_cumulated <-
PDF_daily_impute_char_cumulated[, c(index_group_cols, numeric_cols_new,
expanded_factor_cols,
"project_name", char_cols)]
PDF_daily_impute_char_cumulated
## # A tibble: 322,551 × 69
## # Groups: user_id, project_id [125,126]
## user_id project_id created_at total_redemption_amount amount_charged_in_usd
## <fct> <chr> <fct> <dbl> <dbl>
## 1 100001 695 2022-04-22 0 48.6
## 2 100002 676 2022-04-22 126. 0
## 3 100002 676 2022-04-23 0 1.5
## 4 100003 185 2022-04-22 292. 0
## 5 100003 185 2022-04-22 0 200
## 6 100003 185 2022-04-23 0 41.8
## 7 100005 692 2022-04-22 68.2 0
## 8 100005 692 2023-01-09 49.8 0
## 9 100005 692 2023-01-09 0 18
## 10 100007 695 2022-04-23 0 26.3
## # ℹ 322,541 more rows
## # ℹ 64 more variables: credit_given_in_usd <dbl>, diff <dbl>, tip <dbl>,
## # cumsum_total_redemption_amount <dbl>, cumsum_amount_charged_in_usd <dbl>,
## # cumsum_credit_given_in_usd <dbl>, cumsum_diff <dbl>, cumsum_tip <dbl>,
## # Venue.Type...Detail_Bar <int>, Venue.Type...Detail_Cafe <int>,
## # `Venue.Type...Detail_Casual Dining` <int>,
## # `Venue.Type...Detail_Casual Fine Dining` <int>, …
Our current 5 numeric columns that start with cumsum_
are accumulating all numeric values for each customer, even under
different project_ids. This is not what we would expect, so
we will update the structure and convert the cumsum_
columns into those that only accumulate numeric values for each customer
under each project. That is the reason we perform group_by
on user_id and project_id.
cumsum_cols <- grep("^cumsum_", colnames(PDF_daily_impute_char_cumulated), value = TRUE)
corresponding_cols <- substring(cumsum_cols, 8)
PDF_daily_impute_char_cumulated <-
PDF_daily_impute_char_cumulated |> arrange(user_id, project_id, created_at)
for (i in seq_along(cumsum_cols)) {
cumsum_col <- cumsum_cols[i]
corresponding_col <- corresponding_cols[i]
PDF_daily_impute_char_cumulated <-
PDF_daily_impute_char_cumulated |>
group_by(user_id, project_id) |>
mutate(!!cumsum_col := cumsum(!!sym(corresponding_col))) |>
ungroup()
}
PDF_daily_impute_char_cumulated <-
as.data.frame(PDF_daily_impute_char_cumulated)
head(PDF_daily_impute_char_cumulated)
## user_id project_id created_at total_redemption_amount amount_charged_in_usd
## 1 100001 695 2022-04-22 0.0 48.61
## 2 100002 676 2022-04-22 126.5 0.00
## 3 100002 676 2022-04-23 0.0 1.50
## 4 100003 185 2022-04-22 291.8 0.00
## 5 100003 185 2022-04-22 0.0 200.00
## 6 100003 185 2022-04-23 0.0 41.80
## credit_given_in_usd diff tip cumsum_total_redemption_amount
## 1 48.61 0 0.00 0.0
## 2 0.00 0 20.70 126.5
## 3 1.50 0 0.00 126.5
## 4 0.00 0 58.36 291.8
## 5 250.00 50 0.00 291.8
## 6 41.80 0 0.00 291.8
## cumsum_amount_charged_in_usd cumsum_credit_given_in_usd cumsum_diff
## 1 48.61 48.61 0
## 2 0.00 0.00 0
## 3 1.50 1.50 0
## 4 0.00 0.00 0
## 5 200.00 250.00 50
## 6 241.80 291.80 50
## cumsum_tip Venue.Type...Detail_Bar Venue.Type...Detail_Cafe
## 1 0.00 0 0
## 2 20.70 0 0
## 3 20.70 0 0
## 4 58.36 0 0
## 5 58.36 0 0
## 6 58.36 0 0
## Venue.Type...Detail_Casual Dining Venue.Type...Detail_Casual Fine Dining
## 1 0 0
## 2 0 1
## 3 0 0
## 4 1 0
## 5 0 0
## 6 0 0
## Venue.Type...Detail_Coffee Shop Venue.Type...Detail_Fast Casual
## 1 0 0
## 2 0 0
## 3 0 0
## 4 0 0
## 5 0 0
## 6 0 0
## Venue.Type...Detail_Fast Food Venue.Type...Detail_Fine Dining
## 1 0 0
## 2 0 0
## 3 0 0
## 4 0 0
## 5 0 0
## 6 0 0
## Venue.Type...Detail_Market Venue.Type...Detail_Nightclub
## 1 0 0
## 2 0 0
## 3 0 0
## 4 0 0
## 5 0 0
## 6 0 0
## Venue.Type...Detail_Unknown Check.Average_High Check.Average_Low
## 1 1 0 0
## 2 0 0 0
## 3 1 0 0
## 4 0 0 0
## 5 1 0 0
## 6 1 0 0
## Check.Average_Mid Check.Average_Very High Check.Average_Very Low
## 1 0 0 0
## 2 1 0 0
## 3 0 0 0
## 4 1 0 0
## 5 0 0 0
## 6 0 0 0
## Check.Average_Missing Service.Type_Fast Casual Service.Type_Full Service
## 1 1 0 0
## 2 0 0 1
## 3 1 0 0
## 4 0 0 1
## 5 1 0 0
## 6 1 0 0
## Service.Type_Ghost Kitchen Service.Type_QSR Service.Type_Unknown
## 1 0 0 1
## 2 0 0 0
## 3 0 0 1
## 4 0 0 0
## 5 0 0 1
## 6 0 0 1
## is_app_purchase_0 is_app_purchase_1 is_app_purchase_Missing
## 1 1 0 0
## 2 0 0 1
## 3 1 0 0
## 4 0 0 1
## 5 1 0 0
## 6 1 0 0
## transaction_type_0 transaction_type_1 transaction_type_Missing credit_type_0
## 1 0 1 0 1
## 2 0 0 1 0
## 3 0 1 0 1
## 4 0 0 1 0
## 5 0 1 0 1
## 6 0 1 0 1
## credit_type_5 credit_type_Missing is_excess_0 is_excess_1
## 1 0 0 0 1
## 2 0 1 1 0
## 3 0 0 0 1
## 4 0 1 1 0
## 5 0 0 1 0
## 6 0 0 0 1
## stripe_brand_American Express stripe_brand_Discover stripe_brand_MasterCard
## 1 0 0 0
## 2 0 0 0
## 3 0 0 0
## 4 0 0 0
## 5 0 0 1
## 6 0 0 1
## stripe_brand_Visa stripe_brand_Other project_name
## 1 1 0 Matthew Kenney
## 2 0 1 50 Eggs Hospitality Group
## 3 1 0 50 Eggs Hospitality Group
## 4 0 1 The Ravenous Pig
## 5 0 0 The Ravenous Pig
## 6 0 0 The Ravenous Pig
## Location project_location_id city state
## 1 <NA> <NA> <NA> <NA>
## 2 Yardbird - Washington, DC 2620 Washington DC
## 3 Yardbird - Washington, DC 2620 Washington DC
## 4 The Ravenous Pig 2649 Winter Park FL
## 5 The Ravenous Pig 2649 Winter Park FL
## 6 The Ravenous Pig 2649 Winter Park FL
## credit_transaction_id UID gcp_id ict_id utm_campaign utm_medium
## 1 <NA> 85005g 85005 <NA> <NA> <NA>
## 2 461584 <NA> <NA> <NA> <NA> <NA>
## 3 <NA> 85015g 85015 <NA> <NA> <NA>
## 4 461659 <NA> <NA> <NA> <NA> <NA>
## 5 <NA> 85008g 85008 <NA>
## 6 <NA> 85032g 85032 <NA> <NA> <NA>
## utm_content utm_source option_id account_created_at zip_code user_app_version
## 1 <NA> <NA> 23262 2022-04-22 <NA> 6.3.7.207
## 2 <NA> <NA> <NA> 2022-04-22 <NA> 6.3.7.207
## 3 <NA> <NA> 23268 2022-04-22 <NA> 6.3.7.207
## 4 <NA> <NA> <NA> 2022-04-22 <NA> 6.3.16.241
## 5 18985 2022-04-22 <NA> 6.3.16.241
## 6 <NA> <NA> 23278 2022-04-22 <NA> 6.3.16.241
## user_app_platform
## 1 ios
## 2 ios
## 3 ios
## 4 ios
## 5 ios
## 6 ios
dim(PDF_daily_impute_char_cumulated)
## [1] 322551 69
We should also be careful since our
PDF_daily_impute_char_cumulated includes some universal
projects hosted by the application, according to EDA IV [2]. This should
be treated separately in our analyses. Hence, we will follow the
procedure below to move apart those project_id that is
equal to -999 (we can also split them by extracting the
first digit of UID if it is starting with i).
There are 38,436 observations corresponding to universal projects.
PDF_daily_impute_char_cumulated_i <-
filter(PDF_daily_impute_char_cumulated, project_id == "-999")
PDF_daily_impute_char_cumulated <-
filter(PDF_daily_impute_char_cumulated, project_id != "-999")
dim(PDF_daily_impute_char_cumulated_i)
## [1] 38436 69
dim(PDF_daily_impute_char_cumulated)
## [1] 284115 69
This section selects 3 sub-sections of our previous non-universal
projects’ panel data frame,
PDF_daily_impute_char_cumulated. If it ends with
_NUM, it means besides the grouped index columns
(user_id, group_id, created_at),
there are only numeric columns presented. If it ends with
_FAC, then besides the grouped index columns
(user_id, group_id, created_at),
there are only expanded factor integer columns presented. And if it ends
with _CHAR, then besides the grouped index columns
(user_id, group_id, created_at),
there are only character columns presented. For the rest of
Reconciliation Analysis I, only
PDF_daily_impute_char_cumulated_NUM is utilized.
PDF_daily_impute_char_cumulated_NUM <-
PDF_daily_impute_char_cumulated[, c(index_group_cols, numeric_cols_new)]
PDF_daily_impute_char_cumulated_NUM <-
transform(PDF_daily_impute_char_cumulated_NUM,
project_id = as.factor(project_id))
head(PDF_daily_impute_char_cumulated_NUM)
## user_id project_id created_at total_redemption_amount amount_charged_in_usd
## 1 100001 695 2022-04-22 0.0 48.61
## 2 100002 676 2022-04-22 126.5 0.00
## 3 100002 676 2022-04-23 0.0 1.50
## 4 100003 185 2022-04-22 291.8 0.00
## 5 100003 185 2022-04-22 0.0 200.00
## 6 100003 185 2022-04-23 0.0 41.80
## credit_given_in_usd diff tip cumsum_total_redemption_amount
## 1 48.61 0 0.00 0.0
## 2 0.00 0 20.70 126.5
## 3 1.50 0 0.00 126.5
## 4 0.00 0 58.36 291.8
## 5 250.00 50 0.00 291.8
## 6 41.80 0 0.00 291.8
## cumsum_amount_charged_in_usd cumsum_credit_given_in_usd cumsum_diff
## 1 48.61 48.61 0
## 2 0.00 0.00 0
## 3 1.50 1.50 0
## 4 0.00 0.00 0
## 5 200.00 250.00 50
## 6 241.80 291.80 50
## cumsum_tip
## 1 0.00
## 2 20.70
## 3 20.70
## 4 58.36
## 5 58.36
## 6 58.36
dim(PDF_daily_impute_char_cumulated_NUM)
## [1] 284115 13
PDF_daily_impute_char_cumulated_FAC <-
PDF_daily_impute_char_cumulated[, c(index_group_cols, expanded_factor_cols)]
head(PDF_daily_impute_char_cumulated_FAC)
## user_id project_id created_at Venue.Type...Detail_Bar
## 1 100001 695 2022-04-22 0
## 2 100002 676 2022-04-22 0
## 3 100002 676 2022-04-23 0
## 4 100003 185 2022-04-22 0
## 5 100003 185 2022-04-22 0
## 6 100003 185 2022-04-23 0
## Venue.Type...Detail_Cafe Venue.Type...Detail_Casual Dining
## 1 0 0
## 2 0 0
## 3 0 0
## 4 0 1
## 5 0 0
## 6 0 0
## Venue.Type...Detail_Casual Fine Dining Venue.Type...Detail_Coffee Shop
## 1 0 0
## 2 1 0
## 3 0 0
## 4 0 0
## 5 0 0
## 6 0 0
## Venue.Type...Detail_Fast Casual Venue.Type...Detail_Fast Food
## 1 0 0
## 2 0 0
## 3 0 0
## 4 0 0
## 5 0 0
## 6 0 0
## Venue.Type...Detail_Fine Dining Venue.Type...Detail_Market
## 1 0 0
## 2 0 0
## 3 0 0
## 4 0 0
## 5 0 0
## 6 0 0
## Venue.Type...Detail_Nightclub Venue.Type...Detail_Unknown Check.Average_High
## 1 0 1 0
## 2 0 0 0
## 3 0 1 0
## 4 0 0 0
## 5 0 1 0
## 6 0 1 0
## Check.Average_Low Check.Average_Mid Check.Average_Very High
## 1 0 0 0
## 2 0 1 0
## 3 0 0 0
## 4 0 1 0
## 5 0 0 0
## 6 0 0 0
## Check.Average_Very Low Check.Average_Missing Service.Type_Fast Casual
## 1 0 1 0
## 2 0 0 0
## 3 0 1 0
## 4 0 0 0
## 5 0 1 0
## 6 0 1 0
## Service.Type_Full Service Service.Type_Ghost Kitchen Service.Type_QSR
## 1 0 0 0
## 2 1 0 0
## 3 0 0 0
## 4 1 0 0
## 5 0 0 0
## 6 0 0 0
## Service.Type_Unknown is_app_purchase_0 is_app_purchase_1
## 1 1 1 0
## 2 0 0 0
## 3 1 1 0
## 4 0 0 0
## 5 1 1 0
## 6 1 1 0
## is_app_purchase_Missing transaction_type_0 transaction_type_1
## 1 0 0 1
## 2 1 0 0
## 3 0 0 1
## 4 1 0 0
## 5 0 0 1
## 6 0 0 1
## transaction_type_Missing credit_type_0 credit_type_5 credit_type_Missing
## 1 0 1 0 0
## 2 1 0 0 1
## 3 0 1 0 0
## 4 1 0 0 1
## 5 0 1 0 0
## 6 0 1 0 0
## is_excess_0 is_excess_1 stripe_brand_American Express stripe_brand_Discover
## 1 0 1 0 0
## 2 1 0 0 0
## 3 0 1 0 0
## 4 1 0 0 0
## 5 1 0 0 0
## 6 0 1 0 0
## stripe_brand_MasterCard stripe_brand_Visa stripe_brand_Other
## 1 0 1 0
## 2 0 0 1
## 3 0 1 0
## 4 0 0 1
## 5 1 0 0
## 6 1 0 0
dim(PDF_daily_impute_char_cumulated_FAC)
## [1] 284115 41
PDF_daily_impute_char_cumulated_CHAR <-
PDF_daily_impute_char_cumulated[, c(index_group_cols, "project_id", char_cols)]
head(PDF_daily_impute_char_cumulated_CHAR)
## user_id project_id created_at project_id.1 Location
## 1 100001 695 2022-04-22 695 <NA>
## 2 100002 676 2022-04-22 676 Yardbird - Washington, DC
## 3 100002 676 2022-04-23 676 Yardbird - Washington, DC
## 4 100003 185 2022-04-22 185 The Ravenous Pig
## 5 100003 185 2022-04-22 185 The Ravenous Pig
## 6 100003 185 2022-04-23 185 The Ravenous Pig
## project_location_id city state credit_transaction_id UID gcp_id
## 1 <NA> <NA> <NA> <NA> 85005g 85005
## 2 2620 Washington DC 461584 <NA> <NA>
## 3 2620 Washington DC <NA> 85015g 85015
## 4 2649 Winter Park FL 461659 <NA> <NA>
## 5 2649 Winter Park FL <NA> 85008g 85008
## 6 2649 Winter Park FL <NA> 85032g 85032
## ict_id utm_campaign utm_medium utm_content utm_source option_id
## 1 <NA> <NA> <NA> <NA> <NA> 23262
## 2 <NA> <NA> <NA> <NA> <NA> <NA>
## 3 <NA> <NA> <NA> <NA> <NA> 23268
## 4 <NA> <NA> <NA> <NA> <NA> <NA>
## 5 <NA> 18985
## 6 <NA> <NA> <NA> <NA> <NA> 23278
## account_created_at zip_code user_app_version user_app_platform
## 1 2022-04-22 <NA> 6.3.7.207 ios
## 2 2022-04-22 <NA> 6.3.7.207 ios
## 3 2022-04-22 <NA> 6.3.7.207 ios
## 4 2022-04-22 <NA> 6.3.16.241 ios
## 5 2022-04-22 <NA> 6.3.16.241 ios
## 6 2022-04-22 <NA> 6.3.16.241 ios
dim(PDF_daily_impute_char_cumulated_CHAR)
## [1] 284115 21
In this section, we will present the systematic summary statistics for a picture of the non-reconcilable accounts. Two questions we will answer are:
user_ids and
project_ids exhibit non-reconcilable accounts?To begin, we should define what a reconcilable
account is. The most basic metric here is that for each
user_id under unique project_id, their
cumulative amount of redemption must be less than or equal to their
cumulative amount of transaction. In particular, it can be expressed as
a logic operator such that cumsum_total_redemption_amount
\(\leq\)
cumsum_credit_given_in_usd. However, to avoid the potential
problem of floating point precision, we will adjust the operator
accordingly based on a small tolerant number, \(\epsilon\).
epsilon <- 1e-12
PDF_indiv_Reconciliation <-
PDF_daily_impute_char_cumulated_NUM |> arrange(created_at) |>
group_by(user_id, project_id) |> slice(n())
PDF_indiv_reconciliation_non <- filter(PDF_indiv_Reconciliation,
cumsum_total_redemption_amount > cumsum_credit_given_in_usd + epsilon)
PDF_indiv_reconciliation <- filter(PDF_indiv_Reconciliation,
cumsum_total_redemption_amount <= cumsum_credit_given_in_usd + epsilon)
dim(PDF_indiv_reconciliation_non)
## [1] 46700 13
dim(PDF_indiv_reconciliation)
## [1] 49936 13
Based on the above metric, we have found that there are 46,700
observations that are non-reconcilable, while 49,936 observations are
reconcilable accounts. Regarding the proportions per
user_id and per project_id, they are
calculated below.
PDF_indiv_reconciliation_non <-
transform(PDF_indiv_reconciliation_non,
project_id = as.factor(project_id))
nonreconcilable_user_id <-
PDF_indiv_reconciliation_non |> distinct(user_id) |> nrow()
total_user_id <-
PDF_daily_impute_char_cumulated_NUM |> distinct(user_id) |> nrow()
proportion_user_id <- nonreconcilable_user_id / total_user_id
nonreconcilable_project_id <-
PDF_indiv_reconciliation_non |> distinct(project_id) |> nrow()
total_project_id <-
PDF_daily_impute_char_cumulated_NUM |> distinct(project_id) |> nrow()
proportion_project_id <- nonreconcilable_project_id / total_project_id
non_reconcilable <- c(nonreconcilable_user_id, nonreconcilable_project_id)
total <- c(total_user_id, total_project_id)
proportion <- c(round(proportion_user_id, 4), round(proportion_project_id, 4))
non_reconci_tbl <-
data.frame(non_reconcilable, total, proportion, row.names = c("user_id", "project_id"))
non_reconci_tbl
## non_reconcilable total proportion
## user_id 43217 90867 0.4756
## project_id 160 167 0.9581
Among all user_ids, there are around 47.56% of accounts
that are non-reconcilable. Among all project_ids, there are
around 95.81% of accounts that are non-reconcilable.
PDF_indiv_reconciliation_non$discrep_summary_non <-
PDF_indiv_reconciliation_non$cumsum_total_redemption_amount -
PDF_indiv_reconciliation_non$cumsum_credit_given_in_usd
summary(PDF_indiv_reconciliation_non$discrep_summary_non)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 0.05 30.48 50.00 96.21 84.53 31250.00
Among non-reconcilable observations, we find that the minimum discrepancy amount is 0.05 dollars (if we do not enforce \(\epsilon\) above, then this would return 0 dollars due to error of floating point precision). The maximum discrepancy reaches 31,250 dollars, which is a huge amount. However, looking at the distribution of the amount discrepancy, this is clearly skewed to the right. The visualization, where y-axis is in log scale, is shown below.
ggplot(PDF_indiv_reconciliation_non, aes(x = discrep_summary_non)) +
stat_bin(aes(y = ..count..), bins = 50, color = "black", fill = "skyblue", geom = "bar") +
geom_text(aes(label = ifelse(..count.. > 0, ..count.., ""), y = ..count..),
stat = "bin", bins = 30, vjust = -1) +
scale_y_log10() +
labs(title = "Distribution of Discrepancy Amounts in Non-reconcilable Accounts",
x = "Discrepancy Amount ($)", y = "Frequency (log scale)") +
theme_minimal()
## Warning: The dot-dot notation (`..count..`) was deprecated in ggplot2 3.4.0.
## ℹ Please use `after_stat(count)` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
## Warning: Transformation introduced infinite values in continuous y-axis
## Transformation introduced infinite values in continuous y-axis
## Warning: Removed 29 rows containing missing values (`geom_bar()`).
We should tolerate \(\epsilon\) to a magnitude of at most one dollar since this would exclude some weird inputs recorded by the firm.
epsilon_1 <- 1 + 1e-12
PDF_indiv_reconciliation_non_tol <- filter(PDF_indiv_Reconciliation,
cumsum_total_redemption_amount > cumsum_credit_given_in_usd + epsilon_1)
dim(PDF_indiv_reconciliation_non_tol)
## [1] 46651 13
Allowing some numeric floating point precision tolerances, we reduce the total number of observations for non-reconcilable accounts to 46,651 (compared to previous 46,700, around a deduction of 49). We will take a deeper look at those non-reconcilable observations with relatively smaller discrepancy amount (with the range of 250 dollars and 1000 dollars) below.
PDF_indiv_reconciliation_non_tol$discrep_summary_non <-
PDF_indiv_reconciliation_non_tol$cumsum_total_redemption_amount -
PDF_indiv_reconciliation_non_tol$cumsum_credit_given_in_usd
summary(PDF_indiv_reconciliation_non_tol$discrep_summary_non)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 1.01 30.63 50.00 96.31 84.70 31250.00
ggplot(PDF_indiv_reconciliation_non_tol, aes(x = discrep_summary_non)) +
stat_bin(aes(y = ..count..), bins = 20, color = "black", fill = "skyblue", geom = "bar") +
geom_text(aes(label = ifelse(..count.. > 0, ..count.., ""), y = ..count..),
stat = "bin", bins = 20, vjust = 0) + xlim(c(-20, 250)) +
labs(title = "Distribution of Discrepancy Amounts (less than $250) in Non-reconcilable Accounts",
x = "Discrepancy Amount ($)", y = "Frequency") +
theme_minimal()
## Warning: Removed 2766 rows containing non-finite values (`stat_bin()`).
## Removed 2766 rows containing non-finite values (`stat_bin()`).
## Warning: Removed 2 rows containing missing values (`geom_bar()`).
## Warning: Removed 1 rows containing missing values (`geom_text()`).
ggplot(PDF_indiv_reconciliation_non_tol, aes(x = discrep_summary_non)) +
stat_bin(aes(y = ..count..), bins = 20, color = "black", fill = "skyblue", geom = "bar") +
geom_text(aes(label=..count.., y=..count..),
stat = "bin", bins = 20, vjust = -0.5) + xlim(c(-50, 1000)) +
labs(title = "Distribution of Discrepancy Amounts (less than $1,000) in Non-reconcilable Accounts",
x = "Discrepancy Amount ($)", y = "Frequency") +
theme_minimal()
## Warning: Removed 300 rows containing non-finite values (`stat_bin()`).
## Warning: Removed 300 rows containing non-finite values (`stat_bin()`).
## Warning: Removed 2 rows containing missing values (`geom_bar()`).
## Warning: Removed 1 rows containing missing values (`geom_text()`).
The former plot displays that there are indeed a lot of observations with the discrepancy amount equal to 25, 50, 75, and 100 dollars. You can also see some tiny peaks around 125 and 150 dollars as well. Such a detailed look returns many continuously overlapped normal distributions. These values are common to be offered as the “discount” part (i.e. you pay 200 dollars for transaction and get 250 dollars that can be redeemed in a certain restaurant). Therefore, these non-reconcilable accounts exist reasonably.
The latter plot with a range up to 1,000 dollars displays a similar shape of the Beta distribution where \(\beta >> \alpha\). We see a lot of observations clustering less than 250 dollars. For those relatively sizable discrepancy amount, we should be careful and examine why they would present such behaviors. The following table is a summary of how many non-reconcilable accounts fall under the threshold amounts.
break_points <- c(-Inf, 50, 100, 200, 500, 1000, 10000, 50000, Inf)
labels <- c("<= $50", "<= $100", "<= $200", "<= $500",
"<= $1000", "<= $10000", "<= $50000", "> $50000")
PDF_indiv_reconciliation_non_tol$discrep_category <-
cut(PDF_indiv_reconciliation_non_tol$discrep_summary_non,
breaks = break_points,
labels = labels,
include.lowest = TRUE)
discrep_counts <- table(PDF_indiv_reconciliation_non_tol$discrep_category)
discrep_cumulative_counts <- cumsum(discrep_counts)
discrep_counts_df <- as.data.frame(discrep_counts)
discrep_cumulative_counts_df <- as.data.frame(discrep_cumulative_counts)
colnames(discrep_counts_df) <-
c("discrepancy_amount", "frequency")
discrep_cumulative_counts_df <-
cbind(discrepancy_amount = rownames(discrep_cumulative_counts_df),
discrep_cumulative_counts_df)
rownames(discrep_cumulative_counts_df) <- NULL
colnames(discrep_cumulative_counts_df) <-
c("discrepancy_amount", "cumulative_frequency")
discrep_df <- full_join(discrep_counts_df, discrep_cumulative_counts_df,
by = "discrepancy_amount")
discrep_df
## discrepancy_amount frequency cumulative_frequency
## 1 <= $50 25739 25739
## 2 <= $100 12279 38018
## 3 <= $200 4958 42976
## 4 <= $500 2727 45703
## 5 <= $1000 648 46351
## 6 <= $10000 294 46645
## 7 <= $50000 6 46651
## 8 > $50000 0 46651
We are also interested to learn the patterns of discrepancy
appearance. Three dimensions are taken into care here - time,
discrepancy amount, and the frequency of certain discrepancy amount
under specific time. First, we will model the third variable (the
frequency of certain discrepancy amount under specific time) as the
transparency level, where a darker color implies that the frequency is
higher The following plot is when we set the date variable in the unit
of yyyy-ww.
PDF_indiv_reconciliation_non_tol_seg <-
PDF_indiv_reconciliation_non_tol[, c(1:3, 9, 11, 14)]
PDF_indiv_reconciliation_non_tol_seg$created_at <-
ymd(PDF_indiv_reconciliation_non_tol_seg$created_at)
PDF_indiv_reconciliation_non_tol_seg$year_week <-
format(PDF_indiv_reconciliation_non_tol_seg$created_at, "%Y-%U")
ggplot(PDF_indiv_reconciliation_non_tol_seg,
aes(x = discrep_summary_non, y = year_week)) +
geom_bin2d(bins = 30,
data = PDF_indiv_reconciliation_non_tol_seg, aes(fill = ..count..)) +
scale_fill_gradient(low = "lightpink", high = "darkred") +
labs(title = "Time-series Heatmap of Discrepancy Amounts (/Week)",
y = "Date (Year-Week)", x = "Discrepancy Amount", fill = "Frequency") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1))
We can make two conclusions based on the time-series heatmap above. First, across the entire time periods, discrepancy amount will always appear. That is, for every week, discrepancy between redemption and credit transaction will appear, and almost all of the discrepancy are clustered in a small block with maximum discrepancy less than around 1,000 dollars. The second finding is that, we find significantly more discrepancy frequencies after the 44th week of the year of 2022. We don’t know if there are any marketing campaigns or project events happening during this period, but this trendy information is important since we know more and more observations begin to violate the reconcilable condition. This can be explained by the project that offers some discount coupons to stimulate customers to purchase more. The discrepancy amount is also fairly small, which is reasonable. However, for the large discrepancy amount, it is much more complex to explain, but luckily, the frequency of those extreme discrepancy data is quite low.
We will then modify the date variable in the unit of
yyyy-mm, which may help us discover some seasonal
patterns.
PDF_indiv_reconciliation_non_tol_seg$year_month <-
format(PDF_indiv_reconciliation_non_tol_seg$created_at, "%Y-%m")
ggplot(PDF_indiv_reconciliation_non_tol_seg,
aes(x = discrep_summary_non, y = year_month)) +
geom_bin2d(bins = 30,
data = PDF_indiv_reconciliation_non_tol_seg, aes(fill = ..count..)) +
scale_fill_gradient(low = "lightpink", high = "darkred") +
labs(title = "Time-series Heatmap of Discrepancy Amounts (/Month)",
y = "Date (Year-Month)", x = "Discrepancy Amount", fill = "Frequency") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1))
There is no obvious seasonal patterns detected, unfortunately. However, the increasing frequency trend is clearly not due to the randomness. It can be roughly explained by the projects offer some discount/coupon events to stimulate customers to purchase. Its 3-dimensional version is presented below for better visibility.
PDF_indiv_reconciliation_non_tol_seg_group <-
dplyr::group_by(PDF_indiv_reconciliation_non_tol_seg, year_month, discrep_summary_non) |>
dplyr::summarize(frequency = dplyr::n(), .groups = "drop")
plot_ly(PDF_indiv_reconciliation_non_tol_seg_group,
x = ~ year_month, y = ~ discrep_summary_non, z = ~ frequency,
type = "scatter3d", mode = "markers",
marker = list(size = 4, color = ~ frequency,
colorscale = "Viridis", opacity = 0.8)) |>
layout(title = "3-D Scatterplot of Discrepancy Amounts Over Time",
scene = list(xaxis = list(title = "Date (Year-Month)"),
yaxis = list(title = "Discrepancy Amount"),
zaxis = list(title = "Frequency"),
camera = list(eye =
list(x = -1.25, y = 1.25, z = 1.25))))
Hence, the general pattern we discover is that as time bypasses, both discrepancy amount and its frequency increases.
The final goal we would like to achieve in this reconciliation
analysis is to pick 5 (or a few) emblematic of the non-reconcilable
dynamic transaction/redemption history. Notice that
PDF_indiv_reconciliation_non above only provides the latest
created_at row for each unique pair of user_id
and project_id. To extract the dynamic history, we should
revisit the previous panel data frame
PDF_daily_impute_char_cumulated_NUM and utilize the unique
pair of user_id and project_id.
unique_pairs <-
PDF_indiv_reconciliation_non |> distinct(user_id, project_id)
PDF_indiv_reconciliation_non_dynamic <-
PDF_daily_impute_char_cumulated_NUM |>
inner_join(unique_pairs, by = c("user_id", "project_id"))
PDF_indiv_reconciliation_non_dynamic <-
PDF_indiv_reconciliation_non_dynamic |>
arrange(user_id, project_id, created_at)
head(PDF_indiv_reconciliation_non_dynamic)
## user_id project_id created_at total_redemption_amount amount_charged_in_usd
## 1 100002 676 2022-04-22 126.5 0.0
## 2 100002 676 2022-04-23 0.0 1.5
## 3 100005 692 2022-04-22 68.2 0.0
## 4 100005 692 2023-01-09 49.8 0.0
## 5 100005 692 2023-01-09 0.0 18.0
## 6 100012 702 2022-04-22 257.6 0.0
## credit_given_in_usd diff tip cumsum_total_redemption_amount
## 1 0.0 0 20.70 126.5
## 2 1.5 0 0.00 126.5
## 3 0.0 0 15.75 68.2
## 4 0.0 0 2.00 118.0
## 5 18.0 0 0.00 118.0
## 6 0.0 0 51.61 257.6
## cumsum_amount_charged_in_usd cumsum_credit_given_in_usd cumsum_diff
## 1 0.0 0.0 0
## 2 1.5 1.5 0
## 3 0.0 0.0 0
## 4 0.0 0.0 0
## 5 18.0 18.0 0
## 6 0.0 0.0 0
## cumsum_tip
## 1 20.70
## 2 20.70
## 3 15.75
## 4 17.75
## 5 17.75
## 6 51.61
dim(PDF_indiv_reconciliation_non_dynamic)
## [1] 126477 13
Let’s give some filtering standards to help us automatically pick 5
(or a few) representative non-reconcilable user_ids. First,
the transaction/redemption history must contain at least 10
observations. Let’s see if this rule would provide us with how many
user_ids. If the number is still significant, we will apply
other standards to further reduce and find out the most representative
user_ids.
user_counts <- table(PDF_indiv_reconciliation_non_dynamic$user_id)
users_to_keep <- names(user_counts)[user_counts >= 10]
PDF_indiv_reconciliation_non_dynamic_fil <-
PDF_indiv_reconciliation_non_dynamic |> filter(user_id %in% users_to_keep)
count_tbl <-
PDF_indiv_reconciliation_non_dynamic_fil |>
group_by(user_id, project_id) |> summarise(continuous_period = n())
## `summarise()` has grouped output by 'user_id'. You can override using the
## `.groups` argument.
count_tbl
## # A tibble: 2,328 × 3
## # Groups: user_id [1,524]
## user_id project_id continuous_period
## <fct> <fct> <int>
## 1 100243 727 7
## 2 100243 732 3
## 3 100367 706 17
## 4 100506 255 12
## 5 10074 185 18
## 6 10084 184 10
## 7 100931 697 29
## 8 10105 184 10
## 9 10137 184 11
## 10 101874 699 4
## # ℹ 2,318 more rows
unique(count_tbl$user_id) |> length()
## [1] 1524
Given the first requirement where
continuous_period > 10 for any single
user_id, a unique number of 1,524 user_ids
satisfies. There are a total of 2,328 rows, so we should apply a more
strict rule, say given each user_id under each unique
project_id, the continuous_period must be at
least 20.
count_tbl_strict <-
count_tbl |> filter(continuous_period >= 20)
count_tbl_strict
## # A tibble: 534 × 3
## # Groups: user_id [526]
## user_id project_id continuous_period
## <fct> <fct> <int>
## 1 100931 697 29
## 2 103036 708 20
## 3 104602 697 24
## 4 105119 723 28
## 5 105612 699 54
## 6 10566 184 26
## 7 106541 687 46
## 8 10710 224 29
## 9 107102 722 35
## 10 10880 184 90
## # ℹ 524 more rows
print(paste("Number of unique `user_id`s: ", n_distinct(count_tbl_strict$user_id)))
## [1] "Number of unique `user_id`s: 526"
print(paste("Total number of rows: ", nrow(count_tbl_strict)))
## [1] "Total number of rows: 534"
Now we will apply a third rule to extract the most representative
user_ids. count_tbl_strict has returned 526
unique user_ids, but the total number of rows of
observation is 534. This indicates that some customers’
transaction/redemption history lengths under each unique project are at
least 20. The third rule we will implement is to find duplicated
user_ids in count_tbl_strict.
emblematic_user_id <-
count_tbl_strict[duplicated(count_tbl_strict$user_id), ][, 1]
emblematic_user_id
## # A tibble: 8 × 1
## # Groups: user_id [8]
## user_id
## <fct>
## 1 117376
## 2 16170
## 3 18183
## 4 25670
## 5 40771
## 6 41453
## 7 63193
## 8 70266
The above 8 user_ids are the emblematic of the
non-reconcilable dynamics. Let’s pull the original raw data on these 8
user_ids, respectively.
user_idsOur original raw data frames include
df_redemptions_2021, df_redemptions_2022,
df_redemptions_2023_Jan, df_revenue_view_2021,
df_revenue_view_2022,
df_revenue_view_2023_Jan, df_users_thru_jan23,
df_brand_tags, and df_projects. The latter two
data frames are project-centric data frames, which do not include the
user_id column.The former six data frames are
rbinded in our previous EDA I [3], so we will replace these
six data frames with two data frames that unify the time variable
created_at together, namely, df_redemptions
and df_revenue_view. All 8 representative
user_ids are presented in each of the three raw data frames
(1. df_revenue_view, 2. df_redemptions, 3.
df_users_thru_jan23) below.
user_id: 117376filter(df_revenue_view, user_id == "117376")
## UID name project_id gcp_id ict_id created_at
## V18897.1 93648g Bluestone Lane 699 93648 <NA> 2022-05-31 12:55:22
## V38226 i22110 inKind Pass -999 <NA> 22110 2022-10-10 13:15:47
## amount_charged_in_usd utm_campaign utm_medium utm_content utm_source
## V18897.1 500 <NA> <NA> <NA> <NA>
## V38226 999 <NA> <NA> <NA> <NA>
## is_app_purchase user_id transaction_type credit_type
## V18897.1 1 117376 1 0
## V38226 1 117376 1 0
## credit_given_in_usd is_excess stripe_brand option_id
## V18897.1 650 <NA> American Express 16036
## V38226 1400 <NA> American Express 62
filter(df_redemptions, user_id == "117376")
## user_id created_at project_id project.name
## V36339.1 117376 2022-05-31 09:52:10 699 Bluestone Lane
## V36866.1 117376 2022-06-01 09:04:59 699 Bluestone Lane
## V37109.1 117376 2022-06-02 08:48:27 699 Bluestone Lane
## V38288.1 117376 2022-06-06 09:22:32 699 Bluestone Lane
## V38447.1 117376 2022-06-07 09:36:25 699 Bluestone Lane
## V38865.1 117376 2022-06-09 09:54:49 699 Bluestone Lane
## V40569.1 117376 2022-06-14 09:41:07 699 Bluestone Lane
## V40802.1 117376 2022-06-15 09:36:02 699 Bluestone Lane
## V41067.1 117376 2022-06-16 09:05:10 699 Bluestone Lane
## V42748.1 117376 2022-06-21 09:46:32 699 Bluestone Lane
## V43014.1 117376 2022-06-22 09:25:14 699 Bluestone Lane
## V43264.1 117376 2022-06-23 09:20:42 699 Bluestone Lane
## V43577.1 117376 2022-06-24 09:16:11 699 Bluestone Lane
## V44903.1 117376 2022-06-27 08:56:45 699 Bluestone Lane
## V45125.1 117376 2022-06-28 09:34:36 699 Bluestone Lane
## V45393.1 117376 2022-06-29 08:50:41 699 Bluestone Lane
## V45732.1 117376 2022-06-30 09:13:54 699 Bluestone Lane
## V47495 117376 2022-07-06 09:31:19 699 Bluestone Lane
## V47790 117376 2022-07-07 08:50:26 699 Bluestone Lane
## V49129 117376 2022-07-11 09:12:34 699 Bluestone Lane
## V49331 117376 2022-07-12 09:58:15 699 Bluestone Lane
## V49521 117376 2022-07-13 08:10:56 699 Bluestone Lane
## V49753 117376 2022-07-14 08:26:31 699 Bluestone Lane
## V55002 117376 2022-08-01 08:43:22 699 Bluestone Lane
## V55164 117376 2022-08-02 09:39:30 699 Bluestone Lane
## V55354 117376 2022-08-03 08:23:23 699 Bluestone Lane
## V55562 117376 2022-08-04 09:10:45 699 Bluestone Lane
## V56910 117376 2022-08-09 09:34:39 699 Bluestone Lane
## V57099 117376 2022-08-10 08:45:29 699 Bluestone Lane
## V57341 117376 2022-08-11 08:16:14 699 Bluestone Lane
## V58718 117376 2022-08-16 09:36:28 699 Bluestone Lane
## V58955 117376 2022-08-17 08:30:54 699 Bluestone Lane
## V59184 117376 2022-08-18 09:01:17 699 Bluestone Lane
## V60410 117376 2022-08-22 08:14:20 699 Bluestone Lane
## V60599 117376 2022-08-23 09:31:44 699 Bluestone Lane
## V60781 117376 2022-08-24 08:25:58 699 Bluestone Lane
## V61026 117376 2022-08-25 08:18:40 699 Bluestone Lane
## V62130 117376 2022-08-29 08:40:35 699 Bluestone Lane
## V62267 117376 2022-08-30 09:32:58 699 Bluestone Lane
## V62461 117376 2022-08-31 09:22:04 699 Bluestone Lane
## V62660 117376 2022-09-01 08:33:43 699 Bluestone Lane
## V63982 117376 2022-09-06 09:33:30 699 Bluestone Lane
## V64139 117376 2022-09-07 08:30:09 699 Bluestone Lane
## V64346 117376 2022-09-08 08:39:54 699 Bluestone Lane
## V65470 117376 2022-09-12 08:36:14 699 Bluestone Lane
## V65658 117376 2022-09-13 09:44:58 699 Bluestone Lane
## V65831 117376 2022-09-14 09:05:36 699 Bluestone Lane
## V66036 117376 2022-09-15 09:01:57 699 Bluestone Lane
## V67345 117376 2022-09-20 09:35:37 699 Bluestone Lane
## V67746 117376 2022-09-22 09:06:56 699 Bluestone Lane
## V69000 117376 2022-09-26 09:01:29 699 Bluestone Lane
## V69210 117376 2022-09-27 09:45:11 699 Bluestone Lane
## V69435 117376 2022-09-28 08:07:48 699 Bluestone Lane
## V69658 117376 2022-09-29 09:14:05 699 Bluestone Lane
## V70920 117376 2022-10-03 09:36:54 699 Bluestone Lane
## V71076 117376 2022-10-04 09:32:52 699 Bluestone Lane
## V71289 117376 2022-10-05 08:27:34 699 Bluestone Lane
## V71561 117376 2022-10-06 10:38:41 699 Bluestone Lane
## V71807 117376 2022-10-07 08:16:26 699 Bluestone Lane
## V72932 117376 2022-10-10 09:17:18 699 Bluestone Lane
## V73160 117376 2022-10-11 09:31:29 699 Bluestone Lane
## V73199 117376 2022-10-11 13:22:51 722 Citizens Manhattan West
## V73378 117376 2022-10-12 09:13:18 699 Bluestone Lane
## V73585 117376 2022-10-13 08:29:11 699 Bluestone Lane
## V73843 117376 2022-10-14 08:52:35 699 Bluestone Lane
## V74894 117376 2022-10-17 08:30:29 699 Bluestone Lane
## V74939 117376 2022-10-17 13:01:26 722 Citizens Manhattan West
## V75104 117376 2022-10-18 09:42:33 699 Bluestone Lane
## V75161 117376 2022-10-18 13:34:29 708 Jose Andres Restaurants
## V75404 117376 2022-10-19 13:32:36 708 Jose Andres Restaurants
## V75572 117376 2022-10-20 08:35:00 699 Bluestone Lane
## V75828 117376 2022-10-21 08:21:48 699 Bluestone Lane
## V77106 117376 2022-10-25 09:39:38 699 Bluestone Lane
## V77322 117376 2022-10-26 08:40:08 699 Bluestone Lane
## V77391 117376 2022-10-26 13:21:03 708 Jose Andres Restaurants
## V77593 117376 2022-10-27 08:07:32 699 Bluestone Lane
## V77907 117376 2022-10-28 07:45:32 699 Bluestone Lane
## V79206 117376 2022-10-31 08:33:28 699 Bluestone Lane
## V79254 117376 2022-10-31 13:17:55 722 Citizens Manhattan West
## V79394 117376 2022-11-01 09:36:01 699 Bluestone Lane
## V79680 117376 2022-11-02 09:19:00 699 Bluestone Lane
## V80015 117376 2022-11-03 08:30:42 699 Bluestone Lane
## V82201 117376 2022-11-08 09:37:40 699 Bluestone Lane
## V82314 117376 2022-11-08 15:10:10 722 Citizens Manhattan West
## V82529 117376 2022-11-09 09:34:54 699 Bluestone Lane
## V82599 117376 2022-11-09 13:40:15 708 Jose Andres Restaurants
## V82826 117376 2022-11-10 08:24:16 699 Bluestone Lane
## V82968 117376 2022-11-10 15:31:45 708 Jose Andres Restaurants
## V83271 117376 2022-11-11 08:20:21 699 Bluestone Lane
## V84979 117376 2022-11-14 10:02:10 699 Bluestone Lane
## V85266 117376 2022-11-15 09:46:16 699 Bluestone Lane
## V85363 117376 2022-11-15 13:27:42 722 Citizens Manhattan West
## V85795 117376 2022-11-16 08:13:25 699 Bluestone Lane
## V86005 117376 2022-11-16 14:59:35 708 Jose Andres Restaurants
## V86382 117376 2022-11-17 09:20:54 699 Bluestone Lane
## V89774 117376 2022-11-21 08:35:42 699 Bluestone Lane
## V89903 117376 2022-11-21 13:55:40 708 Jose Andres Restaurants
## V94140 117376 2022-11-28 08:17:39 699 Bluestone Lane
## V94259 117376 2022-11-28 13:37:54 708 Jose Andres Restaurants
## V94708 117376 2022-11-29 13:37:53 708 Jose Andres Restaurants
## V95045 117376 2022-11-30 08:58:20 699 Bluestone Lane
## V95177 117376 2022-11-30 13:35:07 708 Jose Andres Restaurants
## V95544 117376 2022-12-01 08:21:46 699 Bluestone Lane
## V95632 117376 2022-12-01 12:33:53 708 Jose Andres Restaurants
## V98641 117376 2022-12-05 09:24:45 699 Bluestone Lane
## V99056 117376 2022-12-06 09:39:44 699 Bluestone Lane
## V99191 117376 2022-12-06 14:03:11 722 Citizens Manhattan West
## V99495 117376 2022-12-07 08:11:55 699 Bluestone Lane
## V99662 117376 2022-12-07 13:43:42 708 Jose Andres Restaurants
## V100059 117376 2022-12-08 09:13:01 699 Bluestone Lane
## V100606 117376 2022-12-09 09:23:37 699 Bluestone Lane
## V103017 117376 2022-12-12 09:58:48 699 Bluestone Lane
## V103155 117376 2022-12-12 14:14:29 708 Jose Andres Restaurants
## V103440 117376 2022-12-13 09:31:02 699 Bluestone Lane
## V103599 117376 2022-12-13 13:30:20 708 Jose Andres Restaurants
## V104015 117376 2022-12-14 08:13:15 699 Bluestone Lane
## V104573 117376 2022-12-15 08:08:08 699 Bluestone Lane
## V107831 117376 2022-12-19 08:17:21 699 Bluestone Lane
## V108382 117376 2022-12-20 09:49:49 699 Bluestone Lane
## V108967 117376 2022-12-21 09:05:00 699 Bluestone Lane
## V109122 117376 2022-12-21 13:46:15 708 Jose Andres Restaurants
## V109712 117376 2022-12-22 09:40:27 699 Bluestone Lane
## V1788.2 117376 2023-01-04 10:49:28 699 Bluestone Lane
## V2283.2 117376 2023-01-05 09:19:38 699 Bluestone Lane
## V5619.2 117376 2023-01-09 08:25:43 699 Bluestone Lane
## V5715.2 117376 2023-01-09 12:58:46 708 Jose Andres Restaurants
## V6017.2 117376 2023-01-10 10:05:27 699 Bluestone Lane
## V6111.2 117376 2023-01-10 13:00:39 708 Jose Andres Restaurants
## V6462.2 117376 2023-01-11 08:25:33 699 Bluestone Lane
## V6658.2 117376 2023-01-11 14:08:49 775 Whitmans Restaurant Group
## V7047.2 117376 2023-01-12 09:45:35 699 Bluestone Lane
## V7863.2 117376 2023-01-13 14:30:40 708 Jose Andres Restaurants
## V10889.2 117376 2023-01-17 09:36:29 699 Bluestone Lane
## V11008.2 117376 2023-01-17 13:26:25 708 Jose Andres Restaurants
## V11854.2 117376 2023-01-19 08:58:26 699 Bluestone Lane
## V11988.2 117376 2023-01-19 13:34:43 708 Jose Andres Restaurants
## V20318.2 117376 2023-01-30 09:14:52 699 Bluestone Lane
## V20429.2 117376 2023-01-30 13:08:31 708 Jose Andres Restaurants
## V20741.2 117376 2023-01-31 09:33:17 699 Bluestone Lane
## V20894.2 117376 2023-01-31 14:08:07 708 Jose Andres Restaurants
## Location project_location_id city state
## V36339.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V36866.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V37109.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V38288.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V38447.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V38865.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V40569.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V40802.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V41067.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V42748.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V43014.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V43264.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V43577.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V44903.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V45125.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V45393.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V45732.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V47495 Bluestone Lane (Hudson Yards) 3174 New York NY
## V47790 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V49129 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V49331 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V49521 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V49753 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V55002 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V55164 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V55354 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V55562 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V56910 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V57099 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V57341 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V58718 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V58955 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V59184 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V60410 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V60599 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V60781 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V61026 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V62130 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V62267 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V62461 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V62660 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V63982 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V64139 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V64346 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V65470 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V65658 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V65831 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V66036 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V67345 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V67746 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V69000 Bluestone Lane (Hudson Yards) 3174 New York NY
## V69210 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V69435 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V69658 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V70920 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V71076 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V71289 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V71561 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V71807 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V72932 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V73160 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V73199 Cicci Di Carne 3373 New York NY
## V73378 Bluestone Lane (Astor Place) 3184 New York NY
## V73585 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V73843 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V74894 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V74939 Cicci Di Carne 3373 New York NY
## V75104 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V75161 Bocatas - Mercado Little Spain 4762 New York NY
## V75404 Bocatas - Mercado Little Spain 4762 New York NY
## V75572 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V75828 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V77106 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V77322 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V77391 Bocatas - Mercado Little Spain 4762 New York NY
## V77593 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V77907 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V79206 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V79254 Cicci Di Carne 3373 New York NY
## V79394 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V79680 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V80015 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V82201 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V82314 Cicci Di Carne 3373 New York NY
## V82529 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V82599 Bocatas - Mercado Little Spain 4762 New York NY
## V82826 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V82968 Bocatas - Mercado Little Spain 4762 New York NY
## V83271 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V84979 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V85266 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V85363 Sam's Crispy Chicken 3380 New York NY
## V85795 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V86005 Bocatas - Mercado Little Spain 4762 New York NY
## V86382 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V89774 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V89903 Bocatas - Mercado Little Spain 4762 New York NY
## V94140 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V94259 Bar Manolo - Mercado Little Spain 4769 New York NY
## V94708 Bar Manolo - Mercado Little Spain 4769 New York NY
## V95045 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V95177 Bocatas - Mercado Little Spain 4762 New York NY
## V95544 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V95632 Bar Manolo - Mercado Little Spain 4769 New York NY
## V98641 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V99056 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V99191 Cicci Di Carne 3373 New York NY
## V99495 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V99662 Bocatas - Mercado Little Spain 4762 New York NY
## V100059 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V100606 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V103017 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V103155 Bar Manolo - Mercado Little Spain 4769 New York NY
## V103440 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V103599 Bocatas - Mercado Little Spain 4762 New York NY
## V104015 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V104573 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V107831 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V108382 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V108967 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V109122 Bocatas - Mercado Little Spain 4762 New York NY
## V109712 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V1788.2 Bluestone Lane (Astor Place) 3184 New York NY
## V2283.2 Bluestone Lane (Astor Place) 3184 New York NY
## V5619.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V5715.2 Bar Manolo - Mercado Little Spain 4769 New York NY
## V6017.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V6111.2 Bocatas - Mercado Little Spain 4762 New York NY
## V6462.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V6658.2 Whitmans - Hudson Yards 4916 New York NY
## V7047.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V7863.2 Bocatas - Mercado Little Spain 4762 New York NY
## V10889.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V11008.2 Bar Manolo - Mercado Little Spain 4769 New York NY
## V11854.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V11988.2 Bocatas - Mercado Little Spain 4762 New York NY
## V20318.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V20429.2 Bocatas - Mercado Little Spain 4762 New York NY
## V20741.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V20894.2 Bocatas - Mercado Little Spain 4762 New York NY
## credit_transaction_id total_redemption_amount tip Venue.Type...Detail
## V36339.1 511463 10.62 NA Coffee Shop
## V36866.1 512643 10.62 NA Coffee Shop
## V37109.1 513149 10.62 NA Coffee Shop
## V38288.1 515328 10.62 NA Coffee Shop
## V38447.1 515634 10.62 NA Coffee Shop
## V38865.1 516539 10.62 NA Coffee Shop
## V40569.1 520781 10.62 NA Coffee Shop
## V40802.1 521292 10.62 NA Coffee Shop
## V41067.1 521856 10.62 NA Coffee Shop
## V42748.1 525642 10.62 NA Coffee Shop
## V43014.1 526348 10.62 NA Coffee Shop
## V43264.1 526934 10.62 NA Coffee Shop
## V43577.1 527741 10.62 NA Coffee Shop
## V44903.1 530580 10.62 NA Coffee Shop
## V45125.1 531051 10.62 NA Coffee Shop
## V45393.1 531654 10.62 NA Coffee Shop
## V45732.1 532394 10.62 NA Coffee Shop
## V47495 536073 10.62 NA Coffee Shop
## V47790 536764 10.62 NA Coffee Shop
## V49129 539397 10.62 NA Coffee Shop
## V49331 539804 10.62 NA Coffee Shop
## V49521 540200 10.62 NA Coffee Shop
## V49753 540662 10.62 NA Coffee Shop
## V55002 550981 10.62 NA Coffee Shop
## V55164 551298 10.62 NA Coffee Shop
## V55354 551870 10.62 NA Coffee Shop
## V55562 552284 10.62 NA Coffee Shop
## V56910 554746 31.85 NA Coffee Shop
## V57099 555108 10.62 NA Coffee Shop
## V57341 555519 10.62 NA Coffee Shop
## V58718 558164 10.62 NA Coffee Shop
## V58955 558672 10.62 NA Coffee Shop
## V59184 559051 10.62 NA Coffee Shop
## V60410 561340 10.62 NA Coffee Shop
## V60599 561691 10.62 NA Coffee Shop
## V60781 562027 10.62 NA Coffee Shop
## V61026 562432 10.62 NA Coffee Shop
## V62130 564474 10.62 NA Coffee Shop
## V62267 564835 10.62 NA Coffee Shop
## V62461 565208 10.62 NA Coffee Shop
## V62660 565555 10.62 NA Coffee Shop
## V63982 568273 10.62 NA Coffee Shop
## V64139 568576 10.62 NA Coffee Shop
## V64346 568948 10.62 NA Coffee Shop
## V65470 571039 10.62 NA Coffee Shop
## V65658 571387 10.62 NA Coffee Shop
## V65831 571702 10.62 NA Coffee Shop
## V66036 572141 10.62 NA Coffee Shop
## V67345 574526 10.62 NA Coffee Shop
## V67746 575242 10.62 NA Coffee Shop
## V69000 577617 10.62 NA Coffee Shop
## V69210 578027 10.62 NA Coffee Shop
## V69435 578521 10.62 NA Coffee Shop
## V69658 578944 10.62 NA Coffee Shop
## V70920 581199 10.62 NA Coffee Shop
## V71076 581509 10.62 NA Coffee Shop
## V71289 581896 10.62 NA Coffee Shop
## V71561 582432 10.62 NA Coffee Shop
## V71807 582904 10.62 NA Coffee Shop
## V72932 585068 10.62 NA Coffee Shop
## V73160 585491 10.62 NA Coffee Shop
## V73199 585540 15.24 NA Fast Casual
## V73378 585881 16.39 NA Coffee Shop
## V73585 586227 10.62 NA Coffee Shop
## V73843 586673 10.62 NA Coffee Shop
## V74894 588617 10.62 NA Coffee Shop
## V74939 588681 15.24 NA Fast Casual
## V75104 589033 10.62 NA Coffee Shop
## V75161 589111 15.24 NA Casual Dining
## V75404 589579 15.24 NA Casual Dining
## V75572 589964 10.62 NA Coffee Shop
## V75828 590452 10.62 NA Coffee Shop
## V77106 592782 10.62 NA Coffee Shop
## V77322 593201 10.62 NA Coffee Shop
## V77391 593301 15.24 NA Casual Dining
## V77593 593680 10.62 NA Coffee Shop
## V77907 594293 10.62 NA Coffee Shop
## V79206 596746 10.62 NA Coffee Shop
## V79254 596818 15.24 NA Fast Casual
## V79394 597114 10.62 NA Coffee Shop
## V79680 597675 10.62 NA Coffee Shop
## V80015 598299 10.62 NA Coffee Shop
## V82201 602768 10.62 NA Coffee Shop
## V82314 602974 17.42 NA Fast Casual
## V82529 603469 10.62 NA Coffee Shop
## V82599 603589 15.24 NA Casual Dining
## V82826 604077 10.62 NA Coffee Shop
## V82968 604342 15.24 NA Casual Dining
## V83271 604992 10.62 NA Coffee Shop
## V84979 608646 10.62 NA Coffee Shop
## V85266 609310 10.62 NA Coffee Shop
## V85363 609450 13.06 NA Fast Casual
## V85795 610624 10.62 NA Coffee Shop
## V86005 611027 15.24 NA Casual Dining
## V86382 612070 10.62 NA Coffee Shop
## V89774 620127 10.62 NA Coffee Shop
## V89903 620342 15.24 NA Casual Dining
## V94140 630865 10.62 NA Coffee Shop
## V94259 631310 17.42 NA Casual Dining
## V94708 632688 17.42 NA Casual Dining
## V95045 633534 10.62 NA Coffee Shop
## V95177 633740 15.24 NA Casual Dining
## V95544 634634 10.62 NA Coffee Shop
## V95632 634772 17.42 NA Casual Dining
## V98641 641414 10.62 NA Coffee Shop
## V99056 642334 10.62 NA Coffee Shop
## V99191 642585 15.24 NA Fast Casual
## V99495 643362 10.62 NA Coffee Shop
## V99662 643657 15.24 NA Casual Dining
## V100059 644736 10.62 NA Coffee Shop
## V100606 646025 10.62 NA Coffee Shop
## V103017 651612 10.62 NA Coffee Shop
## V103155 651856 15.68 NA Casual Dining
## V103440 652663 10.62 NA Coffee Shop
## V103599 652997 15.24 NA Casual Dining
## V104015 654123 10.62 NA Coffee Shop
## V104573 655596 10.62 NA Coffee Shop
## V107831 663712 10.62 NA Coffee Shop
## V108382 665256 10.62 NA Coffee Shop
## V108967 667052 10.62 NA Coffee Shop
## V109122 667419 15.24 NA Casual Dining
## V109712 669076 10.62 NA Coffee Shop
## V1788.2 690873 21.45 NA Coffee Shop
## V2283.2 691949 10.83 NA Coffee Shop
## V5619.2 699292 21.45 NA Coffee Shop
## V5715.2 699430 17.42 NA Casual Dining
## V6017.2 700119 10.62 NA Coffee Shop
## V6111.2 700383 15.24 NA Casual Dining
## V6462.2 701197 10.83 NA Coffee Shop
## V6658.2 701493 17.42 NA Casual Dining
## V7047.2 702495 10.62 NA Coffee Shop
## V7863.2 704151 15.24 NA Casual Dining
## V10889.2 711019 10.62 NA Coffee Shop
## V11008.2 711204 17.42 NA Casual Dining
## V11854.2 713118 10.83 NA Coffee Shop
## V11988.2 713301 15.24 NA Casual Dining
## V20318.2 732216 10.83 NA Coffee Shop
## V20429.2 732385 15.24 NA Casual Dining
## V20741.2 733160 10.83 NA Coffee Shop
## V20894.2 733392 15.24 NA Casual Dining
## Check.Average Service.Type
## V36339.1 Very Low QSR
## V36866.1 Very Low QSR
## V37109.1 Very Low QSR
## V38288.1 Very Low QSR
## V38447.1 Very Low QSR
## V38865.1 Very Low QSR
## V40569.1 Very Low QSR
## V40802.1 Very Low QSR
## V41067.1 Very Low QSR
## V42748.1 Very Low QSR
## V43014.1 Very Low QSR
## V43264.1 Very Low QSR
## V43577.1 Very Low QSR
## V44903.1 Very Low QSR
## V45125.1 Very Low QSR
## V45393.1 Very Low QSR
## V45732.1 Very Low QSR
## V47495 Very Low QSR
## V47790 Very Low QSR
## V49129 Very Low QSR
## V49331 Very Low QSR
## V49521 Very Low QSR
## V49753 Very Low QSR
## V55002 Very Low QSR
## V55164 Very Low QSR
## V55354 Very Low QSR
## V55562 Very Low QSR
## V56910 Very Low QSR
## V57099 Very Low QSR
## V57341 Very Low QSR
## V58718 Very Low QSR
## V58955 Very Low QSR
## V59184 Very Low QSR
## V60410 Very Low QSR
## V60599 Very Low QSR
## V60781 Very Low QSR
## V61026 Very Low QSR
## V62130 Very Low QSR
## V62267 Very Low QSR
## V62461 Very Low QSR
## V62660 Very Low QSR
## V63982 Very Low QSR
## V64139 Very Low QSR
## V64346 Very Low QSR
## V65470 Very Low QSR
## V65658 Very Low QSR
## V65831 Very Low QSR
## V66036 Very Low QSR
## V67345 Very Low QSR
## V67746 Very Low QSR
## V69000 Very Low QSR
## V69210 Very Low QSR
## V69435 Very Low QSR
## V69658 Very Low QSR
## V70920 Very Low QSR
## V71076 Very Low QSR
## V71289 Very Low QSR
## V71561 Very Low QSR
## V71807 Very Low QSR
## V72932 Very Low QSR
## V73160 Very Low QSR
## V73199 Mid QSR
## V73378 Very Low QSR
## V73585 Very Low QSR
## V73843 Very Low QSR
## V74894 Very Low QSR
## V74939 Mid QSR
## V75104 Very Low QSR
## V75161 Mid Fast Casual
## V75404 Mid Fast Casual
## V75572 Very Low QSR
## V75828 Very Low QSR
## V77106 Very Low QSR
## V77322 Very Low QSR
## V77391 Mid Fast Casual
## V77593 Very Low QSR
## V77907 Very Low QSR
## V79206 Very Low QSR
## V79254 Mid QSR
## V79394 Very Low QSR
## V79680 Very Low QSR
## V80015 Very Low QSR
## V82201 Very Low QSR
## V82314 Mid QSR
## V82529 Very Low QSR
## V82599 Mid Fast Casual
## V82826 Very Low QSR
## V82968 Mid Fast Casual
## V83271 Very Low QSR
## V84979 Very Low QSR
## V85266 Very Low QSR
## V85363 Mid QSR
## V85795 Very Low QSR
## V86005 Mid Fast Casual
## V86382 Very Low QSR
## V89774 Very Low QSR
## V89903 Mid Fast Casual
## V94140 Very Low QSR
## V94259 Mid Fast Casual
## V94708 Mid Fast Casual
## V95045 Very Low QSR
## V95177 Mid Fast Casual
## V95544 Very Low QSR
## V95632 Mid Fast Casual
## V98641 Very Low QSR
## V99056 Very Low QSR
## V99191 Mid QSR
## V99495 Very Low QSR
## V99662 Mid Fast Casual
## V100059 Very Low QSR
## V100606 Very Low QSR
## V103017 Very Low QSR
## V103155 Mid Fast Casual
## V103440 Very Low QSR
## V103599 Mid Fast Casual
## V104015 Very Low QSR
## V104573 Very Low QSR
## V107831 Very Low QSR
## V108382 Very Low QSR
## V108967 Very Low QSR
## V109122 Mid Fast Casual
## V109712 Very Low QSR
## V1788.2 Very Low QSR
## V2283.2 Very Low QSR
## V5619.2 Very Low QSR
## V5715.2 Mid Fast Casual
## V6017.2 Very Low QSR
## V6111.2 Mid Fast Casual
## V6462.2 Very Low QSR
## V6658.2 Mid Full Service
## V7047.2 Very Low QSR
## V7863.2 Mid Fast Casual
## V10889.2 Very Low QSR
## V11008.2 Mid Fast Casual
## V11854.2 Very Low QSR
## V11988.2 Mid Fast Casual
## V20318.2 Very Low QSR
## V20429.2 Mid Fast Casual
## V20741.2 Very Low QSR
## V20894.2 Mid Fast Casual
filter(df_users_thru_jan23, user_id == "117376")
## user_id account_created_at zip_code user_app_version user_app_platform
## V84815 117376 2022-05-31 12:52:20 <NA> 6.4.17.470 ios
user_id: 16170filter(df_revenue_view, user_id == "16170")
## UID name project_id gcp_id ict_id
## V80 32667g Two Hands 687 32667 <NA>
## V868 33603g Two Hands 687 33603 <NA>
## V1905 34877g Two Hands 687 34877 <NA>
## V2710 35812g Reina + Hey ReyRey 306 35812 <NA>
## V3306 36545g Juliet Italian Kitchen 224 36545 <NA>
## V4291 37873g The Market District 277 37873 <NA>
## V4325 37920g Two Hands 687 37920 <NA>
## V4725 38417g The Market District 277 38417 <NA>
## V5227 39027g 50 Eggs Hospitality Group 676 39027 <NA>
## V5240 39042g Elcielo 686 39042 <NA>
## V6569 40760g The Market District 277 40760 <NA>
## V9297 44098g The Market District 277 44098 <NA>
## V10561 45665g Two Hands 687 45665 <NA>
## V12206 47663g The Market District 277 47663 <NA>
## V15533 51587g The Market District 277 51587 <NA>
## V16569 52961g Salvation Pizza 681 52961 <NA>
## V18215 55137g Salvation Pizza 681 55137 <NA>
## V18399 55350g Higher Ground 711 55350 <NA>
## V19532 56735g 138° by Matt Meyer 694 56735 <NA>
## V19908 57191g Salvation Pizza 681 57191 <NA>
## V19934 57231g Mina Group 698 57231 <NA>
## V21014 58681g Salvation Pizza 681 58681 <NA>
## V24325 62846g Elcielo 686 62846 <NA>
## V24383 62918g The Market District 277 62918 <NA>
## V24475 63050g Salvation Pizza 681 63050 <NA>
## V26347 65282g Two Hands 687 65282 <NA>
## V29093 68692g The Market District 277 68692 <NA>
## V30520 i156 inKind Pass -999 <NA> 156
## V30522 70549g Disruptive Group 723 70549 <NA>
## V489.1 72114g Salvation Pizza 681 72114 <NA>
## V2181.1 74203g 50 Eggs Hospitality Group 676 74203 <NA>
## V2182.1 74204g Higher Ground 711 74204 <NA>
## V3801.1 76097g Parson's 706 76097 <NA>
## V3986.1 76303g The Market District 277 76303 <NA>
## V4906.1 77414g Salvation Pizza 681 77414 <NA>
## V5910.1 78655g 50 Eggs Hospitality Group 676 78655 <NA>
## V7505.1 i1207 inKind Pass -999 <NA> 1207
## V7506.1 80628g The Market District 277 80628 <NA>
## V8195.1 81434g Salvation Pizza 681 81434 <NA>
## V8378.1 81641g Salvation Pizza 681 81641 <NA>
## V11015.1 84767g The Market District 277 84767 <NA>
## V11784.1 85662g 50 Eggs Hospitality Group 676 85662 <NA>
## V13169.1 87216g Two Hands 687 87216 <NA>
## V14798.1 89008g Le Pigeon 736 89008 <NA>
## V14833.1 89054g Salvation Pizza 681 89054 <NA>
## V15504.1 89832g The Market District 277 89832 <NA>
## V15751.1 90115g 50 Eggs Hospitality Group 676 90115 <NA>
## V16285.1 90734g Salvation Pizza 681 90734 <NA>
## V20422.1 95378g 50 Eggs Hospitality Group 676 95378 <NA>
## V20423.1 95379g Two Hands 687 95379 <NA>
## V24198.1 99689g Salvation Pizza 681 99689 <NA>
## V24898.1 100477g Le Pigeon 736 100477 <NA>
## V27666.1 103654g Salvation Pizza 681 103654 <NA>
## V28984.1 105102g Salvation Pizza 681 105102 <NA>
## V33285 i20783 inKind Pass -999 <NA> 20783
## V34309 i20858 inKind Pass -999 <NA> 20858
## V38814 i22452 inKind Pass -999 <NA> 22452
## V43284 119495g The Market District 277 119495 <NA>
## V56187 i37146 inKind Pass -999 <NA> 37146
## V56880 i37901 inKind Pass -999 <NA> 37901
## V61895 127601g The Market District 277 127601 <NA>
## V63246 128575g Two Hands 687 128575 <NA>
## V69653 i47854 inKind Pass -999 <NA> 47854
## V14055.2 i86433 inKind Pass -999 <NA> 86433
## created_at amount_charged_in_usd utm_campaign utm_medium
## V80 2021-01-02 01:32:33 40.00 <NA> <NA>
## V868 2021-01-17 20:11:16 128.00 <NA> <NA>
## V1905 2021-01-29 23:00:28 80.00 <NA> <NA>
## V2710 2021-02-06 23:01:34 100.00 <NA> <NA>
## V3306 2021-02-20 23:58:48 80.00 <NA> <NA>
## V4291 2021-03-18 23:33:05 160.00 <NA> <NA>
## V4325 2021-03-19 17:30:04 96.00 <NA> <NA>
## V4725 2021-03-27 04:57:23 250.00 <NA> <NA>
## V5227 2021-04-06 15:57:08 9.37 <NA> <NA>
## V5240 2021-04-06 21:07:20 500.00 <NA> <NA>
## V6569 2021-04-29 13:28:46 250.00 <NA> <NA>
## V9297 2021-05-28 02:39:15 500.00 <NA> <NA>
## V10561 2021-06-12 18:27:36 500.00 <NA> <NA>
## V12206 2021-07-02 22:29:01 500.00 <NA> <NA>
## V15533 2021-08-14 03:39:20 250.00 <NA> <NA>
## V16569 2021-08-26 17:27:52 250.00 <NA> <NA>
## V18215 2021-09-16 14:01:39 250.00 <NA> <NA>
## V18399 2021-09-18 22:18:51 250.00 <NA> <NA>
## V19532 2021-09-26 19:08:26 1.00 <NA> <NA>
## V19908 2021-10-01 00:43:30 100.00 <NA> <NA>
## V19934 2021-10-01 08:32:21 250.00 <NA> <NA>
## V21014 2021-10-16 04:36:42 250.00 <NA> <NA>
## V24325 2021-11-16 23:02:24 160.00 <NA> <NA>
## V24383 2021-11-18 01:01:48 220.31 <NA> <NA>
## V24475 2021-11-19 05:35:35 50.00
## V26347 2021-11-28 22:27:43 250.00 <NA> <NA>
## V29093 2021-12-19 03:44:23 250.00 <NA> <NA>
## V30520 2021-12-25 05:15:56 100.00 <NA> <NA>
## V30522 2021-12-25 05:21:40 100.00 <NA> <NA>
## V489.1 2022-01-08 05:58:13 250.00 <NA> <NA>
## V2181.1 2022-01-28 00:18:28 250.00 <NA> <NA>
## V2182.1 2022-01-28 00:19:42 250.00 <NA> <NA>
## V3801.1 2022-02-11 05:38:59 250.00 <NA> <NA>
## V3986.1 2022-02-12 02:54:48 250.00 <NA> <NA>
## V4906.1 2022-02-20 00:32:00 100.00 <NA> <NA>
## V5910.1 2022-03-02 02:33:31 250.00 <NA> <NA>
## V7505.1 2022-03-21 18:05:51 250.00 <NA> <NA>
## V7506.1 2022-03-21 18:08:48 250.00 <NA> <NA>
## V8195.1 2022-03-26 02:43:36 100.00 <NA> <NA>
## V8378.1 2022-03-27 05:39:55 50.00 <NA> <NA>
## V11015.1 2022-04-21 01:09:47 243.56 <NA> <NA>
## V11784.1 2022-04-27 19:15:40 500.00 <NA> <NA>
## V13169.1 2022-05-06 00:15:37 23.94 <NA> <NA>
## V14798.1 2022-05-14 01:56:26 250.00 <NA> <NA>
## V14833.1 2022-05-14 04:52:34 0.55 <NA> <NA>
## V15504.1 2022-05-18 19:01:09 80.12 <NA> <NA>
## V15751.1 2022-05-20 03:31:22 250.00 <NA> <NA>
## V16285.1 2022-05-22 04:02:51 100.00 <NA> <NA>
## V20422.1 2022-06-11 15:45:58 500.00 <NA> <NA>
## V20423.1 2022-06-11 15:46:16 250.00 <NA> <NA>
## V24198.1 2022-07-04 03:12:20 250.00 <NA> <NA>
## V24898.1 2022-07-08 01:46:13 250.00 <NA> <NA>
## V27666.1 2022-07-29 01:17:26 250.00 <NA> <NA>
## V28984.1 2022-08-06 23:18:10 100.00 <NA> <NA>
## V33285 2022-09-11 00:10:32 249.00 <NA> <NA>
## V34309 2022-09-19 17:11:33 499.00 <NA> <NA>
## V38814 2022-10-14 22:39:23 499.00 <NA> <NA>
## V43284 2022-11-06 04:51:38 1875.35 <NA> <NA>
## V56187 2022-11-22 01:35:27 999.00 <NA> <NA>
## V56880 2022-11-22 06:13:16 -500.00 <NA> <NA>
## V61895 2022-11-26 03:13:38 248.24 <NA> <NA>
## V63246 2022-11-27 16:25:34 5.20 <NA> <NA>
## V69653 2022-12-07 15:40:50 499.00 <NA> <NA>
## V14055.2 2023-01-20 15:57:33 499.00 <NA> <NA>
## utm_content utm_source is_app_purchase user_id transaction_type
## V80 <NA> <NA> 0 16170 1
## V868 <NA> <NA> 0 16170 1
## V1905 <NA> <NA> 0 16170 1
## V2710 <NA> <NA> 0 16170 1
## V3306 <NA> <NA> 0 16170 1
## V4291 <NA> <NA> 0 16170 1
## V4325 <NA> <NA> 0 16170 1
## V4725 <NA> <NA> 0 16170 1
## V5227 <NA> <NA> 0 16170 1
## V5240 <NA> <NA> 0 16170 1
## V6569 <NA> <NA> 0 16170 1
## V9297 <NA> <NA> 0 16170 1
## V10561 <NA> <NA> 0 16170 1
## V12206 <NA> <NA> 0 16170 1
## V15533 <NA> <NA> 0 16170 1
## V16569 <NA> <NA> 0 16170 1
## V18215 <NA> <NA> 0 16170 1
## V18399 <NA> <NA> 0 16170 1
## V19532 <NA> <NA> 0 16170 1
## V19908 <NA> <NA> 0 16170 1
## V19934 <NA> <NA> 0 16170 1
## V21014 <NA> <NA> 0 16170 1
## V24325 <NA> <NA> 0 16170 1
## V24383 <NA> <NA> 0 16170 1
## V24475 0 16170 1
## V26347 <NA> <NA> 0 16170 1
## V29093 <NA> <NA> 0 16170 1
## V30520 <NA> <NA> 1 16170 1
## V30522 <NA> <NA> 0 16170 1
## V489.1 <NA> <NA> 0 16170 1
## V2181.1 <NA> <NA> 1 16170 1
## V2182.1 <NA> <NA> 1 16170 1
## V3801.1 <NA> <NA> 1 16170 1
## V3986.1 <NA> <NA> 1 16170 1
## V4906.1 <NA> <NA> 1 16170 1
## V5910.1 <NA> <NA> 1 16170 1
## V7505.1 <NA> <NA> 1 16170 1
## V7506.1 <NA> <NA> 0 16170 1
## V8195.1 <NA> <NA> 1 16170 1
## V8378.1 <NA> <NA> 1 16170 1
## V11015.1 <NA> <NA> 0 16170 1
## V11784.1 <NA> <NA> 1 16170 1
## V13169.1 <NA> <NA> 0 16170 1
## V14798.1 <NA> <NA> 1 16170 1
## V14833.1 <NA> <NA> 0 16170 1
## V15504.1 <NA> <NA> 0 16170 1
## V15751.1 <NA> <NA> 1 16170 1
## V16285.1 <NA> <NA> 1 16170 1
## V20422.1 <NA> <NA> 1 16170 1
## V20423.1 <NA> <NA> 1 16170 1
## V24198.1 <NA> <NA> 1 16170 1
## V24898.1 <NA> <NA> 1 16170 1
## V27666.1 <NA> <NA> 1 16170 1
## V28984.1 <NA> <NA> 1 16170 1
## V33285 <NA> <NA> 1 16170 1
## V34309 <NA> <NA> 1 16170 1
## V38814 <NA> <NA> 1 16170 1
## V43284 <NA> <NA> 0 16170 1
## V56187 <NA> <NA> 1 16170 1
## V56880 <NA> <NA> 0 16170 0
## V61895 <NA> <NA> 0 16170 1
## V63246 <NA> <NA> 0 16170 1
## V69653 <NA> <NA> 1 16170 1
## V14055.2 <NA> <NA> 1 16170 1
## credit_type credit_given_in_usd is_excess stripe_brand option_id
## V80 0 50.00 <NA> Visa 8998
## V868 0 160.00 <NA> Visa 9863
## V1905 0 100.00 <NA> Visa 8935
## V2710 0 120.00 <NA> Visa 5687
## V3306 0 100.00 <NA> Visa 8393
## V4291 0 200.00 <NA> Visa 5764
## V4325 0 120.00 <NA> Visa 8886
## V4725 0 300.00 <NA> Visa 6015
## V5227 0 9.37 1 Visa 10938
## V5240 0 625.00 <NA> Visa 10011
## V6569 0 300.00 <NA> Visa 6015
## V9297 0 625.00 <NA> Visa 4919
## V10561 0 625.00 <NA> Visa 8795
## V12206 0 625.00 <NA> Visa 4919
## V15533 0 300.00 <NA> Visa 6015
## V16569 0 300.00 <NA> Visa 8381
## V18215 0 300.00 <NA> Visa 8381
## V18399 0 300.00 <NA> Visa 13380
## V19532 0 1.00 1 Visa 15066
## V19908 0 120.00 <NA> Visa 8380
## V19934 0 275.00 <NA> Visa 10642
## V21014 0 315.00 <NA> Visa 15211
## V24325 0 200.00 <NA> Visa 10447
## V24383 0 220.31 1 Visa 16589
## V24475 0 55.00 <NA> Visa 8750
## V26347 0 275.00 <NA> Visa 16057
## V29093 0 275.00 <NA> Visa 16099
## V30520 0 115.00 <NA> <NA> 9
## V30522 0 115.00 <NA> <NA> 18065
## V489.1 0 325.00 <NA> Visa 13923
## V2181.1 0 300.00 <NA> Visa 8114
## V2182.1 0 275.00 <NA> Visa 16012
## V3801.1 0 300.00 <NA> Visa 13524
## V3986.1 0 275.00 <NA> Visa 16099
## V4906.1 0 120.00 <NA> Visa 8380
## V5910.1 0 300.00 <NA> Visa 8114
## V7505.1 0 300.00 <NA> <NA> 5
## V7506.1 0 300.00 <NA> <NA> 21724
## V8195.1 0 120.00 <NA> Visa 8380
## V8378.1 0 55.00 <NA> Visa 8750
## V11015.1 0 243.56 1 Visa 23164
## V11784.1 0 625.00 <NA> Visa 8115
## V13169.1 0 23.94 1 Visa 24276
## V14798.1 0 275.00 <NA> Visa 22358
## V14833.1 0 0.55 1 Visa 25128
## V15504.1 0 80.12 1 Visa 25504
## V15751.1 0 300.00 <NA> Visa 8114
## V16285.1 0 120.00 <NA> Visa 8380
## V20422.1 0 625.00 <NA> Visa 8115
## V20423.1 0 275.00 <NA> Visa 16057
## V24198.1 0 325.00 <NA> Visa 13923
## V24898.1 0 275.00 <NA> Visa 22358
## V27666.1 0 325.00 <NA> Visa 13923
## V28984.1 0 120.00 <NA> Visa 8380
## V33285 0 350.00 <NA> Visa 37
## V34309 0 600.00 <NA> Visa 55
## V38814 0 675.00 <NA> Visa 61
## V43284 0 1875.35 1 Visa 37814
## V56187 0 1400.00 <NA> Visa 100
## V56880 5 -700.70 <NA> <NA> <NA>
## V61895 0 248.24 1 Visa 41281
## V63246 0 5.20 1 Visa 41624
## V69653 0 600.00 <NA> Visa 55
## V14055.2 0 600.00 <NA> Visa 55
filter(df_redemptions, user_id == "16170")
## user_id created_at project_id project.name
## V91 16170 2021-01-01 20:15:51 687 Two Hands
## V367 16170 2021-01-04 15:19:32 692 Thunderdome Restaurant Group
## V368 16170 2021-01-04 15:21:01 692 Thunderdome Restaurant Group
## V574 16170 2021-01-08 14:19:40 676 50 Eggs Hospitality Group
## V576 16170 2021-01-08 15:52:08 676 50 Eggs Hospitality Group
## V579 16170 2021-01-08 16:22:47 676 50 Eggs Hospitality Group
## V1057 16170 2021-01-14 16:21:19 676 50 Eggs Hospitality Group
## V1078 16170 2021-01-14 21:36:07 681 Salvation Pizza
## V1256 16170 2021-01-16 13:23:12 687 Two Hands
## V1300 16170 2021-01-16 18:49:43 277 The Market District
## V1393 16170 2021-01-17 14:16:44 687 Two Hands
## V1423 16170 2021-01-17 20:04:10 277 The Market District
## V2032 16170 2021-01-25 12:41:06 676 50 Eggs Hospitality Group
## V2330 16170 2021-01-29 17:16:23 687 Two Hands
## V3776 16170 2021-02-11 19:02:32 277 The Market District
## V3987 16170 2021-02-13 12:39:06 687 Two Hands
## V4455 16170 2021-02-17 19:02:12 277 The Market District
## V4858 16170 2021-02-21 14:03:27 687 Two Hands
## V6535 16170 2021-03-12 21:19:40 277 The Market District
## V6683 16170 2021-03-13 19:53:01 277 The Market District
## V7175 16170 2021-03-19 13:25:42 687 Two Hands
## V7857 16170 2021-03-27 00:15:57 277 The Market District
## V8718 16170 2021-04-04 20:16:23 676 50 Eggs Hospitality Group
## V8805 16170 2021-04-06 11:57:10 676 50 Eggs Hospitality Group
## V8868 16170 2021-04-06 21:24:51 686 Elcielo
## V12219 16170 2021-05-08 16:03:38 299 Magna
## V14560 16170 2021-05-28 12:16:15 299 Magna
## V16687 16170 2021-06-12 14:24:53 687 Two Hands
## V17329 16170 2021-06-17 19:33:08 277 The Market District
## V17504 16170 2021-06-18 20:22:23 277 The Market District
## V17586 16170 2021-06-19 13:04:13 687 Two Hands
## V19455 16170 2021-07-03 13:36:37 687 Two Hands
## V21440 16170 2021-07-20 16:46:07 681 Salvation Pizza
## V21443 16170 2021-07-20 17:15:05 681 Salvation Pizza
## V21616 16170 2021-07-22 16:46:43 681 Salvation Pizza
## V21622 16170 2021-07-22 17:25:53 681 Salvation Pizza
## V21624 16170 2021-07-22 17:30:15 681 Salvation Pizza
## V21625 16170 2021-07-22 17:31:31 681 Salvation Pizza
## V21862 16170 2021-07-24 10:48:29 687 Two Hands
## V22297 16170 2021-07-27 18:02:01 681 Salvation Pizza
## V23973 16170 2021-08-10 09:08:54 687 Two Hands
## V23977 16170 2021-08-10 10:26:04 681 Salvation Pizza
## V24034 16170 2021-08-10 17:31:19 681 Salvation Pizza
## V24076 16170 2021-08-10 23:15:06 681 Salvation Pizza
## V24150 16170 2021-08-11 18:44:06 681 Salvation Pizza
## V24820 16170 2021-08-16 10:38:57 687 Two Hands
## V24853 16170 2021-08-16 15:25:13 681 Salvation Pizza
## V25228 16170 2021-08-20 09:47:04 687 Two Hands
## V26197 16170 2021-08-26 22:37:42 681 Salvation Pizza
## V28650 16170 2021-09-12 01:02:07 681 Salvation Pizza
## V29152 16170 2021-09-16 19:00:37 681 Salvation Pizza
## V29158 16170 2021-09-16 19:41:06 681 Salvation Pizza
## V29382 16170 2021-09-18 00:37:13 681 Salvation Pizza
## V30108 16170 2021-09-23 22:08:10 681 Salvation Pizza
## V30217 16170 2021-09-24 18:09:27 681 Salvation Pizza
## V30409 16170 2021-09-25 13:25:38 681 Salvation Pizza
## V30619 16170 2021-09-26 12:08:28 694 138° by Matt Meyer
## V31191 16170 2021-09-30 20:41:08 681 Salvation Pizza
## V31222 16170 2021-10-01 00:01:31 711 Higher Ground
## V31883 16170 2021-10-04 21:19:09 681 Salvation Pizza
## V31958 16170 2021-10-05 19:59:16 681 Salvation Pizza
## V32216 16170 2021-10-07 20:18:03 277 The Market District
## V32440 16170 2021-10-09 01:37:21 681 Salvation Pizza
## V33196 16170 2021-10-14 21:03:59 711 Higher Ground
## V33395 16170 2021-10-15 23:44:22 681 Salvation Pizza
## V36238 16170 2021-11-04 23:28:05 681 Salvation Pizza
## V37312 16170 2021-11-11 18:58:49 681 Salvation Pizza
## V37599 16170 2021-11-13 12:55:50 681 Salvation Pizza
## V37902 16170 2021-11-14 17:05:25 681 Salvation Pizza
## V38262 16170 2021-11-17 19:01:50 277 The Market District
## V38466 16170 2021-11-18 22:10:05 681 Salvation Pizza
## V38749 16170 2021-11-20 13:42:16 711 Higher Ground
## V39742 16170 2021-11-26 14:47:25 681 Salvation Pizza
## V40196 16170 2021-11-28 17:38:52 687 Two Hands
## V40732 16170 2021-12-02 18:10:26 681 Salvation Pizza
## V42069 16170 2021-12-09 22:52:11 681 Salvation Pizza
## V44038 16170 2021-12-18 23:06:40 711 Higher Ground
## V44870 16170 2021-12-23 19:52:11 299 Magna
## V20.1 16170 2022-01-01 02:07:28 681 Salvation Pizza
## V996.1 16170 2022-01-08 00:02:01 681 Salvation Pizza
## V3290.1 16170 2022-01-21 20:35:48 681 Salvation Pizza
## V5844.1 16170 2022-02-04 19:00:28 681 Salvation Pizza
## V6791.1 16170 2022-02-08 21:35:41 681 Salvation Pizza
## V7750.1 16170 2022-02-12 18:06:25 681 Salvation Pizza
## V7940.1 16170 2022-02-12 23:19:45 681 Salvation Pizza
## V8951.1 16170 2022-02-18 17:31:31 681 Salvation Pizza
## V9345.1 16170 2022-02-19 18:48:51 681 Salvation Pizza
## V9431.1 16170 2022-02-19 20:31:48 681 Salvation Pizza
## V9432.1 16170 2022-02-19 20:33:42 681 Salvation Pizza
## V10934.1 16170 2022-02-27 01:28:55 681 Salvation Pizza
## V10935.1 16170 2022-02-27 01:42:43 681 Salvation Pizza
## V14438.1 16170 2022-03-16 22:04:40 681 Salvation Pizza
## V15539.1 16170 2022-03-21 19:50:45 277 The Market District
## V15600.1 16170 2022-03-22 14:12:22 687 Two Hands
## V16243.1 16170 2022-03-25 19:13:35 681 Salvation Pizza
## V16354.1 16170 2022-03-25 21:55:03 681 Salvation Pizza
## V16537.1 16170 2022-03-26 17:14:30 681 Salvation Pizza
## V16748.1 16170 2022-03-27 00:40:44 681 Salvation Pizza
## V20690.1 16170 2022-04-14 20:12:22 681 Salvation Pizza
## V22063.1 16170 2022-04-20 20:09:49 277 The Market District
## V23772.1 16170 2022-04-27 20:22:14 681 Salvation Pizza
## V24139.1 16170 2022-04-28 22:15:07 681 Salvation Pizza
## V25224.1 16170 2022-04-30 23:04:20 681 Salvation Pizza
## V26393.1 16170 2022-05-05 19:15:40 687 Two Hands
## V28994.1 16170 2022-05-13 18:00:15 277 The Market District
## V29273.1 16170 2022-05-13 23:52:36 681 Salvation Pizza
## V30694.1 16170 2022-05-18 14:01:12 277 The Market District
## V31268.1 16170 2022-05-20 00:08:09 277 The Market District
## V32072.1 16170 2022-05-21 18:54:05 711 Higher Ground
## V32123.1 16170 2022-05-21 19:43:01 711 Higher Ground
## V32282.1 16170 2022-05-21 23:03:11 681 Salvation Pizza
## V39226.1 16170 2022-06-09 21:50:26 681 Salvation Pizza
## V39646.1 16170 2022-06-11 01:53:32 681 Salvation Pizza
## V39669.1 16170 2022-06-11 11:04:06 687 Two Hands
## V40210.1 16170 2022-06-12 17:35:26 681 Salvation Pizza
## V47061 16170 2022-07-03 19:18:00 277 The Market District
## V47137 16170 2022-07-03 22:13:44 681 Salvation Pizza
## V48244 16170 2022-07-08 18:26:35 681 Salvation Pizza
## V51522 16170 2022-07-20 19:53:17 681 Salvation Pizza
## V52217 16170 2022-07-22 22:55:31 681 Salvation Pizza
## V52382 16170 2022-07-23 16:11:25 681 Salvation Pizza
## V53890 16170 2022-07-28 20:18:02 681 Salvation Pizza
## V54697 16170 2022-07-30 22:09:35 681 Salvation Pizza
## V55782 16170 2022-08-04 23:17:52 681 Salvation Pizza
## V56285 16170 2022-08-06 18:22:05 681 Salvation Pizza
## V57550 16170 2022-08-11 21:47:46 306 Reina + Hey ReyRey
## V65044 16170 2022-09-10 17:43:33 681 Salvation Pizza
## V65567 16170 2022-09-12 18:18:00 681 Salvation Pizza
## V68753 16170 2022-09-25 10:25:31 687 Two Hands
## V69492 16170 2022-09-28 13:55:02 306 Reina + Hey ReyRey
## V69714 16170 2022-09-29 14:21:16 681 Salvation Pizza
## V70256 16170 2022-10-01 08:12:51 687 Two Hands
## V70297 16170 2022-10-01 12:23:31 681 Salvation Pizza
## V71427 16170 2022-10-05 18:51:31 681 Salvation Pizza
## V71572 16170 2022-10-06 11:52:11 697 Parker Hospitality
## V71585 16170 2022-10-06 12:41:07 697 Parker Hospitality
## V74559 16170 2022-10-15 22:12:34 277 The Market District
## V76352 16170 2022-10-22 15:43:06 681 Salvation Pizza
## V81459 16170 2022-11-05 23:51:40 277 The Market District
## V83955 16170 2022-11-12 13:30:55 681 Salvation Pizza
## V91776 16170 2022-11-25 11:16:51 687 Two Hands
## V92070 16170 2022-11-25 17:28:57 681 Salvation Pizza
## V92414 16170 2022-11-25 21:13:41 277 The Market District
## V93493 16170 2022-11-27 10:25:37 687 Two Hands
## V103147 16170 2022-12-12 14:02:29 786 The Butcher's Daughter
## V104596 16170 2022-12-15 09:33:03 699 Bluestone Lane
## V107105 16170 2022-12-18 00:46:25 681 Salvation Pizza
## V111683 16170 2022-12-26 09:02:07 687 Two Hands
## V20965.2 16170 2023-01-31 17:25:04 681 Salvation Pizza
## Location project_location_id city
## V91 Two Hands - Austin South Congress 187 Austin
## V367 Bakersfield - Cincinnati 2558 Cincinnati
## V368 Bakersfield - Cincinnati 2558 Cincinnati
## V574 CHICA - Miami 2588 Miami
## V576 CHICA - Miami 2588 Miami
## V579 CHICA - Miami 2588 Miami
## V1057 CHICA - Miami 2588 Miami
## V1078 Salvation Rainey 176 Austin
## V1256 Two Hands - Austin South Congress 187 Austin
## V1300 Devil May Care 134 Austin
## V1393 Two Hands - Austin South Congress 187 Austin
## V1423 TenTen 135 Austin
## V2032 CHICA - Las Vegas 168 Las Vegas
## V2330 Two Hands - Austin South Congress 187 Austin
## V3776 Devil May Care 134 Austin
## V3987 Two Hands - Austin South Congress 187 Austin
## V4455 TenTen 135 Austin
## V4858 Two Hands - Austin South Congress 187 Austin
## V6535 TenTen 135 Austin
## V6683 Devil May Care 134 Austin
## V7175 Two Hands - Austin South Congress 187 Austin
## V7857 Devil May Care 134 Austin
## V8718 CHICA - Miami 2588 Miami
## V8805 Yardbird - Miami 169 Miami Beach
## V8868 Elcielo Miami 181 Miami
## V12219 Magna 2873 Portland
## V14560 Magna 2873 Portland
## V16687 Two Hands - Austin South Congress 187 Austin
## V17329 Devil May Care 134 Austin
## V17504 TenTen 135 Austin
## V17586 Two Hands - Austin South Congress 187 Austin
## V19455 Two Hands - Austin South Congress 187 Austin
## V21440 Salvation Rainey 176 Austin
## V21443 Salvation Rainey 176 Austin
## V21616 Salvation Rainey 176 Austin
## V21622 Salvation Rainey 176 Austin
## V21624 Salvation Rainey 176 Austin
## V21625 Salvation Rainey 176 Austin
## V21862 Two Hands - Austin South Congress 187 Austin
## V22297 Salvation Rainey 176 Austin
## V23973 Two Hands - Austin South Congress 187 Austin
## V23977 Salvation Rainey 176 Austin
## V24034 Salvation Domain 177 Austin
## V24076 Salvation Domain 177 Austin
## V24150 Salvation Rainey 176 Austin
## V24820 Two Hands - Austin South Congress 187 Austin
## V24853 Salvation Rainey 176 Austin
## V25228 Two Hands - Austin South Congress 187 Austin
## V26197 Salvation Rainey 176 Austin
## V28650 Salvation Rainey 176 Austin
## V29152 Salvation Rainey 176 Austin
## V29158 Salvation Rainey 176 Austin
## V29382 Salvation Rainey 176 Austin
## V30108 Salvation Rainey 176 Austin
## V30217 Salvation Rainey 176 Austin
## V30409 Salvation Rainey 176 Austin
## V30619 138° by Matt Meyer 2641 Henderson
## V31191 Salvation Rainey 176 Austin
## V31222 Higher Ground, Austin 3263 Austin
## V31883 Salvation Rainey 176 Austin
## V31958 Salvation Rainey 176 Austin
## V32216 The Well 3266 Austin
## V32440 Salvation Rainey 176 Austin
## V33196 Higher Ground, Austin 3263 Austin
## V33395 Salvation Rainey 176 Austin
## V36238 Salvation Rainey 176 Austin
## V37312 Salvation Rainey 176 Austin
## V37599 Salvation Rainey 176 Austin
## V37902 Salvation Rainey 176 Austin
## V38262 TenTen 135 Austin
## V38466 Salvation Rainey 176 Austin
## V38749 Higher Ground, Austin 3263 Austin
## V39742 Salvation Rainey 176 Austin
## V40196 Two Hands - Austin South Congress 187 Austin
## V40732 Salvation Rainey 176 Austin
## V42069 Salvation Rainey 176 Austin
## V44038 Higher Ground, Austin 3263 Austin
## V44870 Magna 2873 Portland
## V20.1 Salvation Rainey 176 Austin
## V996.1 Salvation Rainey 176 Austin
## V3290.1 Salvation Rainey 176 Austin
## V5844.1 Salvation Rainey 176 Austin
## V6791.1 Salvation Rainey 176 Austin
## V7750.1 Salvation Rainey 176 Austin
## V7940.1 Salvation Rainey 176 Austin
## V8951.1 Salvation Rainey 176 Austin
## V9345.1 Salvation Rainey 176 Austin
## V9431.1 Salvation Rainey 176 Austin
## V9432.1 Salvation Rainey 176 Austin
## V10934.1 Salvation Rainey 176 Austin
## V10935.1 Salvation Rainey 176 Austin
## V14438.1 Salvation Rainey 176 Austin
## V15539.1 TenTen 135 Austin
## V15600.1 Two Hands - Austin South Congress 187 Austin
## V16243.1 Salvation Rainey 176 Austin
## V16354.1 Salvation Rainey 176 Austin
## V16537.1 Salvation Rainey 176 Austin
## V16748.1 Salvation Rainey 176 Austin
## V20690.1 Salvation Rainey 176 Austin
## V22063.1 TenTen 135 Austin
## V23772.1 Salvation Rainey 176 Austin
## V24139.1 Salvation Rainey 176 Austin
## V25224.1 Salvation Rainey 176 Austin
## V26393.1 Two Hands - Austin South Congress 187 Austin
## V28994.1 The Well 3266 Austin
## V29273.1 Salvation Rainey 176 Austin
## V30694.1 The Well 3266 Austin
## V31268.1 Mayfair 4713 Austin
## V32072.1 Higher Ground, Austin 3263 Austin
## V32123.1 Higher Ground, Austin 3263 Austin
## V32282.1 Salvation Rainey 176 Austin
## V39226.1 Salvation Rainey 176 Austin
## V39646.1 Salvation Rainey 176 Austin
## V39669.1 Two Hands - Austin South Congress 187 Austin
## V40210.1 Salvation Rainey 176 Austin
## V47061 Devil May Care 134 Austin
## V47137 Salvation Rainey 176 Austin
## V48244 Salvation Rainey 176 Austin
## V51522 Salvation Rainey 176 Austin
## V52217 Salvation Rainey 176 Austin
## V52382 Salvation Rainey 176 Austin
## V53890 Salvation Rainey 176 Austin
## V54697 Salvation Rainey 176 Austin
## V55782 Salvation Rainey 176 Austin
## V56285 Salvation Rainey 176 Austin
## V57550 Reina + Hey ReyRey 2650 Austin
## V65044 Salvation Rainey 176 Austin
## V65567 Salvation Rainey 176 Austin
## V68753 Two Hands - Austin South Congress 187 Austin
## V69492 Reina + Hey ReyRey 2650 Austin
## V69714 Salvation Domain 177 Austin
## V70256 Two Hands - Austin South Congress 187 Austin
## V70297 Salvation Rainey 176 Austin
## V71427 Salvation Rainey 176 Austin
## V71572 The Hampton Social - Nashville 2613 Nashville
## V71585 The Hampton Social - Nashville 2613 Nashville
## V74559 TenTen 135 Austin
## V76352 Salvation Rainey 176 Austin
## V81459 Mayfair 4713 Austin
## V83955 Salvation Rainey 176 Austin
## V91776 Two Hands - Austin South Congress 187 Austin
## V92070 Salvation Rainey 176 Austin
## V92414 TenTen 135 Austin
## V93493 Two Hands - Austin South Congress 187 Austin
## V103147 The Butcher's Daughter - West Village 4963 New York
## V104596 Bluestone Lane (Madison Ave) 4585 New York
## V107105 Salvation Rainey 176 Austin
## V111683 Two Hands - Austin South Congress 187 Austin
## V20965.2 Salvation Rainey 176 Austin
## state credit_transaction_id total_redemption_amount tip
## V91 TX 237895 72.53 15.96
## V367 OH 238536 4.31 NA
## V368 OH 238538 4.31 0.72
## V574 FL 239154 6.48 1.08
## V576 FL 239180 6.48 1.08
## V579 FL 239189 6.48 1.08
## V1057 FL 240353 6.48 1.00
## V1078 TX 240432 19.49 5.00
## V1256 TX 240826 13.53 2.98
## V1300 TX 240934 236.54 52.04
## V1393 TX 241122 156.41 34.41
## V1423 TX 241228 566.15 124.55
## V2032 NV 242769 1.63 0.50
## V2330 TX 243710 36.80 7.36
## V3776 TX 247509 188.36 50.00
## V3987 TX 247926 21.65 4.76
## V4455 TX 248894 222.99 49.06
## V4858 TX 249710 17.32 3.81
## V6535 TX 253644 284.73 62.64
## V6683 TX 253919 199.16 50.00
## V7175 TX 255026 155.33 31.07
## V7857 TX 256773 568.30 125.03
## V8718 FL 258663 176.04 35.86
## V8805 FL 258885 146.06 30.00
## V8868 FL 259023 612.50 25.00
## V12219 266489 5.00 NA
## V14560 271605 1.00 NA
## V16687 TX 275736 259.79 75.00
## V17329 TX 277006 210.01 52.50
## V17504 TX 277293 691.72 175.00
## V17586 TX 277477 102.29 25.57
## V19455 TX 280997 13.00 5.00
## V21440 TX 284759 3.41 1.00
## V21443 TX 284765 5.41 1.00
## V21616 TX 285123 5.85 1.00
## V21622 TX 285147 5.85 1.00
## V21624 TX 285151 3.00 NA
## V21625 TX 285153 3.50 NA
## V21862 TX 285591 22.19 5.55
## V22297 TX 286422 5.85 1.00
## V23973 TX 290256 55.74 13.94
## V23977 TX 290263 3.25 NA
## V24034 TX 290368 3.25 NA
## V24076 TX 290453 3.25 0.55
## V24150 TX 290630 5.50 0.90
## V24820 TX 291813 19.48 4.87
## V24853 TX 291864 3.79 0.63
## V25228 TX 292647 41.14 10.28
## V26197 TX 295495 11.69 2.33
## V28650 TX 302096 54.56 10.91
## V29152 TX 303653 5.85 2.00
## V29158 TX 303668 6.50 2.00
## V29382 TX 304073 11.69 2.92
## V30108 TX 306749 15.59 3.60
## V30217 TX 307018 40.31 10.00
## V30409 TX 307349 15.16 3.08
## V30619 NV 307721 1.00 1.00
## V31191 TX 309643 15.64 3.17
## V31222 TX 309733 34.64 7.62
## V31883 TX 311061 10.72 3.00
## V31958 TX 311294 5.85 2.00
## V32216 TX 312610 182.95 50.00
## V32440 TX 313254 31.28 10.00
## V33196 TX 315322 75.78 NA
## V33395 TX 315750 156.88 31.88
## V36238 TX 325923 15.59 3.60
## V37312 TX 328800 6.50 1.00
## V37599 TX 329427 10.83 2.00
## V37902 TX 329997 22.73 4.62
## V38262 TX 331477 220.31 55.07
## V38466 TX 334053 17.54 5.00
## V38749 TX 334816 15.16 5.00
## V39742 TX 342132 12.67 2.92
## V40196 TX 343738 88.78 22.19
## V40732 TX 346870 23.82 4.40
## V42069 TX 355342 11.69 2.37
## V44038 TX 369748 98.51 20.00
## V44870 375852 137.00 100.00
## V20.1 TX 379890 37.99 7.02
## V996.1 TX 382554 83.04 19.17
## V3290.1 TX 389745 5.52 3.00
## V5844.1 TX 396363 98.45 20.00
## V6791.1 TX 398794 40.92 7.56
## V7750.1 TX 403380 59.54 12.10
## V7940.1 TX 403683 51.53 10.47
## V8951.1 TX 406448 27.28 5.04
## V9345.1 TX 407155 11.04 2.24
## V9431.1 TX 407261 11.04 2.24
## V9432.1 TX 407263 6.82 2.00
## V10934.1 TX 411950 23.92 10.00
## V10935.1 TX 411952 19.32 3.92
## V14438.1 TX 426819 16.56 5.00
## V15539.1 TX 438069 214.33 53.58
## V15600.1 TX 438187 93.64 25.00
## V16243.1 TX 439804 5.50 2.00
## V16354.1 TX 439967 92.93 20.00
## V16537.1 TX 440329 19.32 3.93
## V16748.1 TX 440654 29.23 5.94
## V20690.1 TX 457838 41.14 8.36
## V22063.1 TX 460678 243.56 60.00
## V23772.1 TX 468200 6.50 2.00
## V24139.1 TX 469743 6.50 2.00
## V25224.1 TX 472224 40.48 7.48
## V26393.1 TX 477941 136.39 27.52
## V28994.1 TX 488612 86.61 20.00
## V29273.1 TX 489104 12.99 2.64
## V30694.1 TX 497298 80.12 18.50
## V31268.1 TX 498706 1548.34 387.09
## V32072.1 TX 500574 64.96 16.00
## V32123.1 TX 500676 73.61 17.00
## V32282.1 TX 500914 5.85 2.00
## V39226.1 TX 517805 12.99 2.64
## V39646.1 TX 518731 25.33 5.15
## V39669.1 TX 518806 61.71 12.54
## V40210.1 TX 519914 11.91 2.42
## V47061 TX 535058 81.17 18.75
## V47137 TX 535200 74.97 15.24
## V48244 TX 537770 48.71 9.90
## V51522 TX 544106 50.66 10.30
## V52217 TX 545559 176.66 35.90
## V52382 TX 545870 5.52 2.00
## V53890 TX 548809 170.60 34.67
## V54697 TX 550375 62.35 12.67
## V55782 TX 552672 88.33 17.95
## V56285 TX 553579 100.46 20.42
## V57550 TX 555889 30.30 NA
## V65044 TX 570208 16.51 3.36
## V65567 TX 571236 5.52 2.00
## V68753 TX 577153 18.41 4.25
## V69492 TX 578632 1.00 NA
## V69714 TX 579034 3.25 1.00
## V70256 TX 580054 13.54 2.75
## V70297 TX 580138 16.24 3.00
## V71427 TX 582181 18.51 3.76
## V71572 TN 582465 27.37 6.25
## V71585 TN 582488 70.09 15.00
## V74559 TX 587910 750.00 320.32
## V76352 TX 591405 85.79 15.84
## V81459 TX 601209 2205.00 400.00
## V83955 TX 606502 17.48 5.00
## V91776 TX 625078 165.08 33.55
## V92070 TX 625895 81.81 16.62
## V92414 TX 626604 1053.25 210.65
## V93493 TX 629413 71.46 14.52
## V103147 NY 651836 80.02 18.38
## V104596 NY 655637 16.28 2.69
## V107105 TX 661890 58.46 11.88
## V111683 TX 675676 51.96 12.00
## V20965.2 TX 733639 29.44 5.98
## Venue.Type...Detail Check.Average Service.Type
## V91 Casual Dining Mid Full Service
## V367 Casual Dining Mid Full Service
## V368 Casual Dining Mid Full Service
## V574 Casual Fine Dining Mid Full Service
## V576 Casual Fine Dining Mid Full Service
## V579 Casual Fine Dining Mid Full Service
## V1057 Casual Fine Dining Mid Full Service
## V1078 Casual Dining Very Low Full Service
## V1256 Casual Dining Mid Full Service
## V1300 Nightclub Mid Full Service
## V1393 Casual Dining Mid Full Service
## V1423 Casual Fine Dining Mid Full Service
## V2032 Casual Fine Dining Mid Full Service
## V2330 Casual Dining Mid Full Service
## V3776 Nightclub Mid Full Service
## V3987 Casual Dining Mid Full Service
## V4455 Casual Fine Dining Mid Full Service
## V4858 Casual Dining Mid Full Service
## V6535 Casual Fine Dining Mid Full Service
## V6683 Nightclub Mid Full Service
## V7175 Casual Dining Mid Full Service
## V7857 Nightclub Mid Full Service
## V8718 Casual Fine Dining Mid Full Service
## V8805 Casual Fine Dining Mid Full Service
## V8868 Fine Dining Very High Full Service
## V12219 Unknown Mid Unknown
## V14560 Unknown Mid Unknown
## V16687 Casual Dining Mid Full Service
## V17329 Nightclub Mid Full Service
## V17504 Casual Fine Dining Mid Full Service
## V17586 Casual Dining Mid Full Service
## V19455 Casual Dining Mid Full Service
## V21440 Casual Dining Very Low Full Service
## V21443 Casual Dining Very Low Full Service
## V21616 Casual Dining Very Low Full Service
## V21622 Casual Dining Very Low Full Service
## V21624 Casual Dining Very Low Full Service
## V21625 Casual Dining Very Low Full Service
## V21862 Casual Dining Mid Full Service
## V22297 Casual Dining Very Low Full Service
## V23973 Casual Dining Mid Full Service
## V23977 Casual Dining Very Low Full Service
## V24034 Casual Dining Very Low Full Service
## V24076 Casual Dining Very Low Full Service
## V24150 Casual Dining Very Low Full Service
## V24820 Casual Dining Mid Full Service
## V24853 Casual Dining Very Low Full Service
## V25228 Casual Dining Mid Full Service
## V26197 Casual Dining Very Low Full Service
## V28650 Casual Dining Very Low Full Service
## V29152 Casual Dining Very Low Full Service
## V29158 Casual Dining Very Low Full Service
## V29382 Casual Dining Very Low Full Service
## V30108 Casual Dining Very Low Full Service
## V30217 Casual Dining Very Low Full Service
## V30409 Casual Dining Very Low Full Service
## V30619 Casual Dining Mid Full Service
## V31191 Casual Dining Very Low Full Service
## V31222 Bar Mid Full Service
## V31883 Casual Dining Very Low Full Service
## V31958 Casual Dining Very Low Full Service
## V32216 Casual Fine Dining Mid Full Service
## V32440 Casual Dining Very Low Full Service
## V33196 Bar Mid Full Service
## V33395 Casual Dining Very Low Full Service
## V36238 Casual Dining Very Low Full Service
## V37312 Casual Dining Very Low Full Service
## V37599 Casual Dining Very Low Full Service
## V37902 Casual Dining Very Low Full Service
## V38262 Casual Fine Dining Mid Full Service
## V38466 Casual Dining Very Low Full Service
## V38749 Bar Mid Full Service
## V39742 Casual Dining Very Low Full Service
## V40196 Casual Dining Mid Full Service
## V40732 Casual Dining Very Low Full Service
## V42069 Casual Dining Very Low Full Service
## V44038 Bar Mid Full Service
## V44870 Unknown Mid Unknown
## V20.1 Casual Dining Very Low Full Service
## V996.1 Casual Dining Very Low Full Service
## V3290.1 Casual Dining Very Low Full Service
## V5844.1 Casual Dining Very Low Full Service
## V6791.1 Casual Dining Very Low Full Service
## V7750.1 Casual Dining Very Low Full Service
## V7940.1 Casual Dining Very Low Full Service
## V8951.1 Casual Dining Very Low Full Service
## V9345.1 Casual Dining Very Low Full Service
## V9431.1 Casual Dining Very Low Full Service
## V9432.1 Casual Dining Very Low Full Service
## V10934.1 Casual Dining Very Low Full Service
## V10935.1 Casual Dining Very Low Full Service
## V14438.1 Casual Dining Very Low Full Service
## V15539.1 Casual Fine Dining Mid Full Service
## V15600.1 Casual Dining Mid Full Service
## V16243.1 Casual Dining Very Low Full Service
## V16354.1 Casual Dining Very Low Full Service
## V16537.1 Casual Dining Very Low Full Service
## V16748.1 Casual Dining Very Low Full Service
## V20690.1 Casual Dining Very Low Full Service
## V22063.1 Casual Fine Dining Mid Full Service
## V23772.1 Casual Dining Very Low Full Service
## V24139.1 Casual Dining Very Low Full Service
## V25224.1 Casual Dining Very Low Full Service
## V26393.1 Casual Dining Mid Full Service
## V28994.1 Casual Fine Dining Mid Full Service
## V29273.1 Casual Dining Very Low Full Service
## V30694.1 Casual Fine Dining Mid Full Service
## V31268.1 Nightclub Mid Full Service
## V32072.1 Bar Mid Full Service
## V32123.1 Bar Mid Full Service
## V32282.1 Casual Dining Very Low Full Service
## V39226.1 Casual Dining Very Low Full Service
## V39646.1 Casual Dining Very Low Full Service
## V39669.1 Casual Dining Mid Full Service
## V40210.1 Casual Dining Very Low Full Service
## V47061 Nightclub Mid Full Service
## V47137 Casual Dining Very Low Full Service
## V48244 Casual Dining Very Low Full Service
## V51522 Casual Dining Very Low Full Service
## V52217 Casual Dining Very Low Full Service
## V52382 Casual Dining Very Low Full Service
## V53890 Casual Dining Very Low Full Service
## V54697 Casual Dining Very Low Full Service
## V55782 Casual Dining Very Low Full Service
## V56285 Casual Dining Very Low Full Service
## V57550 Unknown Mid Unknown
## V65044 Casual Dining Very Low Full Service
## V65567 Casual Dining Very Low Full Service
## V68753 Casual Dining Mid Full Service
## V69492 Unknown Mid Unknown
## V69714 Casual Dining Very Low Full Service
## V70256 Casual Dining Mid Full Service
## V70297 Casual Dining Very Low Full Service
## V71427 Casual Dining Very Low Full Service
## V71572 Casual Fine Dining High Full Service
## V71585 Casual Fine Dining High Full Service
## V74559 Casual Fine Dining Mid Full Service
## V76352 Casual Dining Very Low Full Service
## V81459 Nightclub Mid Full Service
## V83955 Casual Dining Very Low Full Service
## V91776 Casual Dining Mid Full Service
## V92070 Casual Dining Very Low Full Service
## V92414 Casual Fine Dining Mid Full Service
## V93493 Casual Dining Mid Full Service
## V103147 Casual Dining Mid Full Service
## V104596 Coffee Shop Very Low QSR
## V107105 Casual Dining Very Low Full Service
## V111683 Casual Dining Mid Full Service
## V20965.2 Casual Dining Very Low Full Service
filter(df_users_thru_jan23, user_id == "16170")
## user_id account_created_at zip_code user_app_version user_app_platform
## V13096 16170 2019-06-21 21:18:44 78701 6.4.17.470 ios
user_id: 18183filter(df_revenue_view, user_id == "18183")
## UID name project_id gcp_id ict_id
## V3418 36681g Matthew Kenney 695 36681 <NA>
## V4657 38326g The Market District 277 38326 <NA>
## V4949 38694g Matthew Kenney 695 38694 <NA>
## V4971 38720g The Farmers Butcher 683 38720 <NA>
## V6434 40575g Two Hands 687 40575 <NA>
## V8385 42976g Two Hands 687 42976 <NA>
## V11255 46539g Parker Hospitality 697 46539 <NA>
## V11398 46724g Two Hands 687 46724 <NA>
## V12920 48554g The Market District 277 48554 <NA>
## V13641 49428g Two Hands 687 49428 <NA>
## V16447 52811g The Market District 277 52811 <NA>
## V17573 54340g Parker Hospitality 697 54340 <NA>
## V17589 54356g Jose Andres Restaurants 708 54356 <NA>
## V19752 57024g Silk Road Hospitality 713 57024 <NA>
## V21184 58891g The Market District 277 58891 <NA>
## V24417 62970g The Bungalow 715 62970 <NA>
## V24480 63055g The Market District 277 63055 <NA>
## V24482 63057g The Bungalow 715 63057 <NA>
## V24483 63058g The Bungalow 715 63058 <NA>
## V24484 63059g The Bungalow 715 63059 <NA>
## V28513 68002g Silk Road Hospitality 713 68002 <NA>
## V30405 70423g Matthew Kenney 695 70423 <NA>
## V420.1 72016g Mina Group 698 72016 <NA>
## V840.1 72578g Citizens Manhattan West 722 72578 <NA>
## V2400.1 74471g Two Hands 687 74471 <NA>
## V2726.1 74836g Parson's 706 74836 <NA>
## V3790.1 76083g The Electric Jane 720 76083 <NA>
## V4815.1 77313g The Concourse Project 721 77313 <NA>
## V4840.1 77341g Two Hands 687 77341 <NA>
## V4974.1 77511g The Market District 277 77511 <NA>
## V5423.1 78061g Two Hands 687 78061 <NA>
## V7485.1 80596g Disruptive Group 723 80596 <NA>
## V12351.1 86308g 50 Eggs Hospitality Group 676 86308 <NA>
## V17594.1 92208g 50 Eggs Hospitality Group 676 92208 <NA>
## V20071.1 94970g Mirame 729 94970 <NA>
## V20340.1 95274g The Bungalow 715 95274 <NA>
## V27574.1 103543g The Market District 277 103543 <NA>
## V31492 107982g Two Hands 687 107982 <NA>
## V32206 i20680 inKind Pass -999 <NA> 20680
## V36998 i21353 inKind Pass -999 <NA> 21353
## V45361 i26381 inKind Pass -999 <NA> 26381
## V61779 i42177 inKind Pass -999 <NA> 42177
## V76599 i54936 inKind Pass -999 <NA> 54936
## V14045.2 i86416 inKind Pass -999 <NA> 86416
## created_at amount_charged_in_usd utm_campaign utm_medium
## V3418 2021-02-24 20:11:14 500.00 <NA> <NA>
## V4657 2021-03-26 02:16:15 250.00 <NA> <NA>
## V4949 2021-04-01 04:46:40 500.00 <NA> <NA>
## V4971 2021-04-01 22:26:17 100.00 <NA> <NA>
## V6434 2021-04-28 00:09:58 500.00 <NA> <NA>
## V8385 2021-05-20 00:03:56 500.00 <NA> <NA>
## V11255 2021-06-21 15:09:24 40.00 <NA> <NA>
## V11398 2021-06-24 14:22:44 500.00 <NA> <NA>
## V12920 2021-07-16 01:24:56 500.00 <NA> <NA>
## V13641 2021-07-27 14:40:28 500.00 <NA> <NA>
## V16447 2021-08-25 00:29:52 500.00 <NA> <NA>
## V17573 2021-09-06 23:00:19 250.00 <NA> <NA>
## V17589 2021-09-07 00:48:34 250.00 <NA> <NA>
## V19752 2021-09-30 14:15:25 250.00 <NA> <NA>
## V21184 2021-10-18 21:35:01 500.00 <NA> <NA>
## V24417 2021-11-18 17:19:50 250.00 <NA> <NA>
## V24480 2021-11-19 06:57:20 30.00
## V24482 2021-11-19 06:59:14 30.00
## V24483 2021-11-19 07:00:45 30.00
## V24484 2021-11-19 07:12:00 31.00
## V28513 2021-12-16 02:52:57 250.00 <NA> <NA>
## V30405 2021-12-24 21:24:07 250.00 <NA> <NA>
## V420.1 2022-01-07 18:21:57 500.00 <NA> <NA>
## V840.1 2022-01-13 18:06:43 250.00 <NA> <NA>
## V2400.1 2022-01-29 17:38:39 250.00 <NA> <NA>
## V2726.1 2022-02-01 03:19:02 250.00 <NA> <NA>
## V3790.1 2022-02-11 03:54:26 250.00 <NA> <NA>
## V4815.1 2022-02-19 06:21:25 1000.00 <NA> <NA>
## V4840.1 2022-02-19 18:09:40 0.88 <NA> <NA>
## V4974.1 2022-02-20 14:54:25 250.00 <NA> <NA>
## V5423.1 2022-02-25 16:51:06 250.00 <NA> <NA>
## V7485.1 2022-03-21 01:19:41 500.00 <NA> <NA>
## V12351.1 2022-04-30 13:41:05 500.00 <NA> <NA>
## V17594.1 2022-05-28 05:15:22 500.00 <NA> <NA>
## V20071.1 2022-06-09 20:08:55 10.00 <NA> <NA>
## V20340.1 2022-06-11 00:57:52 250.00 <NA> <NA>
## V27574.1 2022-07-28 02:38:18 250.00 <NA> <NA>
## V31492 2022-08-27 20:22:01 500.00 <NA> <NA>
## V32206 2022-09-02 22:41:26 499.00 <NA> <NA>
## V36998 2022-10-05 00:53:41 499.00 <NA> <NA>
## V45361 2022-11-14 16:14:09 50.00
## V61779 2022-11-26 02:18:37 499.00 <NA> <NA>
## V76599 2022-12-17 02:33:57 499.00 <NA> <NA>
## V14045.2 2023-01-20 15:41:12 499.00 <NA> <NA>
## utm_content utm_source is_app_purchase user_id transaction_type
## V3418 <NA> <NA> 0 18183 1
## V4657 <NA> <NA> 0 18183 1
## V4949 <NA> <NA> 0 18183 1
## V4971 <NA> <NA> 0 18183 1
## V6434 <NA> <NA> 0 18183 1
## V8385 <NA> <NA> 0 18183 1
## V11255 <NA> <NA> 0 18183 1
## V11398 <NA> <NA> 0 18183 1
## V12920 <NA> <NA> 0 18183 1
## V13641 <NA> <NA> 0 18183 1
## V16447 <NA> <NA> 0 18183 1
## V17573 <NA> <NA> 0 18183 1
## V17589 <NA> <NA> 0 18183 1
## V19752 <NA> <NA> 0 18183 1
## V21184 <NA> <NA> 0 18183 1
## V24417 <NA> <NA> 0 18183 1
## V24480 0 18183 1
## V24482 0 18183 1
## V24483 0 18183 1
## V24484 0 18183 1
## V28513 <NA> <NA> 0 18183 1
## V30405 <NA> <NA> 0 18183 1
## V420.1 <NA> <NA> 0 18183 1
## V840.1 <NA> <NA> 1 18183 1
## V2400.1 <NA> <NA> 1 18183 1
## V2726.1 <NA> <NA> 1 18183 1
## V3790.1 <NA> <NA> 1 18183 1
## V4815.1 <NA> <NA> 1 18183 1
## V4840.1 <NA> <NA> 0 18183 1
## V4974.1 <NA> <NA> 1 18183 1
## V5423.1 <NA> <NA> 1 18183 1
## V7485.1 <NA> <NA> 1 18183 1
## V12351.1 <NA> <NA> 1 18183 1
## V17594.1 <NA> <NA> 1 18183 1
## V20071.1 <NA> <NA> 0 18183 1
## V20340.1 <NA> <NA> 1 18183 1
## V27574.1 <NA> <NA> 1 18183 1
## V31492 <NA> <NA> 1 18183 1
## V32206 <NA> <NA> 1 18183 1
## V36998 <NA> <NA> 1 18183 1
## V45361 0 18183 1
## V61779 <NA> <NA> 1 18183 1
## V76599 <NA> <NA> 1 18183 1
## V14045.2 <NA> <NA> 1 18183 1
## credit_type credit_given_in_usd is_excess stripe_brand option_id
## V3418 0 575.00 <NA> Visa 10374
## V4657 0 300.00 <NA> Visa 6015
## V4949 0 625.00 <NA> Visa 10754
## V4971 0 115.00 <NA> Visa 10005
## V6434 0 625.00 <NA> Visa 8795
## V8385 0 625.00 <NA> American Express 8795
## V11255 0 50.00 <NA> American Express 11117
## V11398 0 625.00 <NA> American Express 8795
## V12920 0 625.00 <NA> American Express 4919
## V13641 0 625.00 <NA> American Express 8795
## V16447 0 625.00 <NA> Visa 4919
## V17573 0 300.00 <NA> Visa 10466
## V17589 0 300.00 <NA> Visa 13145
## V19752 0 300.00 <NA> Visa 14099
## V21184 0 625.00 <NA> Visa 4919
## V24417 0 275.00 <NA> Visa 16083
## V24480 0 36.00 <NA> American Express 12728
## V24482 0 36.00 <NA> Visa 16624
## V24483 0 36.00 <NA> Visa 16624
## V24484 0 37.20 <NA> American Express 16626
## V28513 0 275.00 <NA> Visa 15998
## V30405 0 275.00 <NA> Visa 10373
## V420.1 0 575.00 <NA> Visa 16038
## V840.1 0 275.00 <NA> Visa 16120
## V2400.1 0 275.00 <NA> Visa 16057
## V2726.1 0 300.00 <NA> Visa 13524
## V3790.1 0 275.00 <NA> Visa 15696
## V4815.1 0 1250.00 <NA> Visa 16096
## V4840.1 0 0.88 1 Visa 20563
## V4974.1 0 275.00 <NA> Visa 16099
## V5423.1 0 275.00 <NA> Visa 16057
## V7485.1 0 600.00 <NA> American Express 16124
## V12351.1 0 625.00 <NA> American Express 8115
## V17594.1 0 625.00 <NA> American Express 8115
## V20071.1 0 10.00 1 American Express 27870
## V20340.1 0 275.00 <NA> American Express 16083
## V27574.1 0 275.00 <NA> Visa 16099
## V31492 0 625.00 <NA> Visa 16058
## V32206 0 700.00 <NA> Visa 38
## V36998 0 675.00 <NA> American Express 61
## V45361 0 50.00 <NA> American Express 74
## V61779 0 700.00 <NA> American Express 38
## V76599 0 600.00 <NA> American Express 55
## V14045.2 0 600.00 <NA> American Express 55
filter(df_redemptions, user_id == "18183")
## user_id created_at project_id project.name
## V8333 18183 2021-03-31 21:50:07 695 Matthew Kenney
## V8334 18183 2021-03-31 21:56:05 695 Matthew Kenney
## V9553 18183 2021-04-14 17:32:24 695 Matthew Kenney
## V10277 18183 2021-04-21 14:03:32 687 Two Hands
## V10517 18183 2021-04-23 22:03:56 687 Two Hands
## V11047 18183 2021-04-29 11:36:30 687 Two Hands
## V12019 18183 2021-05-07 15:11:53 687 Two Hands
## V12105 18183 2021-05-07 21:52:42 687 Two Hands
## V12218 18183 2021-05-08 16:00:26 687 Two Hands
## V12548 18183 2021-05-10 20:49:46 687 Two Hands
## V12654 18183 2021-05-12 09:32:34 687 Two Hands
## V12655 18183 2021-05-12 09:33:23 687 Two Hands
## V13065 18183 2021-05-15 12:07:34 687 Two Hands
## V13068 18183 2021-05-15 12:14:33 687 Two Hands
## V13189 18183 2021-05-15 22:01:27 687 Two Hands
## V13652 18183 2021-05-20 21:01:16 687 Two Hands
## V14540 18183 2021-05-28 08:42:26 687 Two Hands
## V14789 18183 2021-05-29 14:11:06 687 Two Hands
## V15692 18183 2021-06-05 10:17:56 687 Two Hands
## V17398 18183 2021-06-18 11:21:40 687 Two Hands
## V18063 18183 2021-06-23 09:47:11 687 Two Hands
## V18476 18183 2021-06-26 10:17:00 687 Two Hands
## V18658 18183 2021-06-27 11:08:24 687 Two Hands
## V20711 18183 2021-07-14 21:14:02 687 Two Hands
## V20822 18183 2021-07-15 21:24:01 277 The Market District
## V20830 18183 2021-07-15 22:01:20 277 The Market District
## V21378 18183 2021-07-19 20:32:05 687 Two Hands
## V21664 18183 2021-07-22 20:57:19 687 Two Hands
## V22100 18183 2021-07-25 17:32:09 687 Two Hands
## V24308 18183 2021-08-12 20:53:31 687 Two Hands
## V24466 18183 2021-08-13 22:40:30 277 The Market District
## V24975 18183 2021-08-17 20:16:09 687 Two Hands
## V25139 18183 2021-08-19 17:03:17 676 50 Eggs Hospitality Group
## V25221 18183 2021-08-19 22:33:04 676 50 Eggs Hospitality Group
## V25450 18183 2021-08-21 12:26:49 687 Two Hands
## V26817 18183 2021-08-31 12:01:45 277 The Market District
## V27097 18183 2021-09-02 15:57:53 277 The Market District
## V27875 18183 2021-09-06 20:47:51 697 Parker Hospitality
## V29319 18183 2021-09-17 20:05:07 687 Two Hands
## V29883 18183 2021-09-22 12:05:57 699 Bluestone Lane
## V31123 18183 2021-09-30 15:32:10 277 The Market District
## V31982 18183 2021-10-05 21:54:41 277 The Market District
## V33164 18183 2021-10-14 19:11:42 687 Two Hands
## V33384 18183 2021-10-15 21:59:49 687 Two Hands
## V34734 18183 2021-10-24 20:42:02 687 Two Hands
## V35045 18183 2021-10-27 22:10:29 277 The Market District
## V35046 18183 2021-10-27 22:13:29 277 The Market District
## V35053 18183 2021-10-28 10:11:39 277 The Market District
## V43267 18183 2021-12-15 20:55:24 713 Silk Road Hospitality
## V647.1 18183 2022-01-05 20:53:13 687 Two Hands
## V1384.1 18183 2022-01-09 19:44:54 277 The Market District
## V1773.1 18183 2022-01-13 13:13:26 722 Citizens Manhattan West
## V3985.1 18183 2022-01-25 14:51:25 277 The Market District
## V4435.1 18183 2022-01-28 10:35:57 687 Two Hands
## V4436.1 18183 2022-01-28 10:40:55 687 Two Hands
## V6025.1 18183 2022-02-05 12:28:09 687 Two Hands
## V7223.1 18183 2022-02-11 11:45:28 720 The Electric Jane
## V7902.1 18183 2022-02-12 21:22:52 716 Union Square Hospitality Group
## V8185.1 18183 2022-02-14 13:17:16 687 Two Hands
## V8432.1 18183 2022-02-15 14:20:40 716 Union Square Hospitality Group
## V8854.1 18183 2022-02-17 21:10:44 716 Union Square Hospitality Group
## V9155.1 18183 2022-02-19 00:21:56 721 The Concourse Project
## V9198.1 18183 2022-02-19 12:09:42 687 Two Hands
## V9508.1 18183 2022-02-20 08:55:47 277 The Market District
## V13118.1 18183 2022-03-10 14:50:56 687 Two Hands
## V14100.1 18183 2022-03-14 21:05:07 687 Two Hands
## V14657.1 18183 2022-03-18 11:21:46 277 The Market District
## V16035.1 18183 2022-03-24 21:00:23 713 Silk Road Hospitality
## V17675.1 18183 2022-03-31 20:12:08 687 Two Hands
## V18774.1 18183 2022-04-05 13:03:08 277 The Market District
## V18874.1 18183 2022-04-06 09:23:53 687 Two Hands
## V18935.1 18183 2022-04-06 15:46:22 277 The Market District
## V26849.1 18183 2022-05-06 22:40:28 676 50 Eggs Hospitality Group
## V27310.1 18183 2022-05-07 21:55:54 723 Disruptive Group
## V27361.1 18183 2022-05-07 23:21:15 723 Disruptive Group
## V31513.1 18183 2022-05-20 18:44:41 697 Parker Hospitality
## V31757.1 18183 2022-05-21 08:55:55 743 inKind Wine Bar
## V31758.1 18183 2022-05-21 08:56:33 743 inKind Wine Bar
## V31760.1 18183 2022-05-21 08:59:22 743 inKind Wine Bar
## V31761.1 18183 2022-05-21 09:00:07 743 inKind Wine Bar
## V31766.1 18183 2022-05-21 09:12:59 743 inKind Wine Bar
## V32323.1 18183 2022-05-22 09:53:51 697 Parker Hospitality
## V32680.1 18183 2022-05-22 21:31:24 697 Parker Hospitality
## V34490.1 18183 2022-05-27 22:15:48 676 50 Eggs Hospitality Group
## V35046.1 18183 2022-05-28 20:14:48 723 Disruptive Group
## V36428.1 18183 2022-05-31 14:16:28 277 The Market District
## V38928.1 18183 2022-06-09 13:08:58 729 Mirame
## V44599.1 18183 2022-06-26 12:48:57 687 Two Hands
## V48717 18183 2022-07-09 20:10:40 277 The Market District
## V53420 18183 2022-07-27 08:28:17 687 Two Hands
## V53657 18183 2022-07-27 21:38:26 277 The Market District
## V53877 18183 2022-07-28 19:59:43 726 City Winery
## V61652 18183 2022-08-27 15:22:37 687 Two Hands
## V67395 18183 2022-09-20 14:44:27 741 Black Seed Bagels + Pebble Bar
## V70657 18183 2022-10-02 11:37:40 687 Two Hands
## V71233 18183 2022-10-04 19:53:58 277 The Market District
## V74217 18183 2022-10-15 11:16:48 687 Two Hands
## V77336 18183 2022-10-26 09:53:20 719 Catalogue
## V77341 18183 2022-10-26 10:50:24 699 Bluestone Lane
## V77563 18183 2022-10-26 21:33:06 686 Elcielo
## V77611 18183 2022-10-27 10:09:05 719 Catalogue
## V77933 18183 2022-10-28 10:29:51 719 Catalogue
## V80226 18183 2022-11-03 19:34:47 224 Juliet Italian Kitchen
## V81221 18183 2022-11-05 19:02:00 277 The Market District
## V81503 18183 2022-11-06 11:23:52 687 Two Hands
## V87422 18183 2022-11-18 19:23:15 200 TLC
## V95428 18183 2022-11-30 20:25:28 687 Two Hands
## V97965 18183 2022-12-04 12:27:12 687 Two Hands
## V105806 18183 2022-12-16 20:41:20 711 Higher Ground
## V107435 18183 2022-12-18 15:53:36 687 Two Hands
## V113859 18183 2022-12-29 12:56:20 794 Paperboy
## V18171.2 18183 2023-01-27 21:33:03 721 The Concourse Project
## V18189.2 18183 2023-01-27 21:46:43 721 The Concourse Project
## Location project_location_id
## V8333 PLANT FOOD + WINE 2594
## V8334 PLANT FOOD + WINE 2594
## V9553 PLANT FOOD + WINE 2594
## V10277 Two Hands - Austin South Congress 187
## V10517 Two Hands - Austin South Congress 187
## V11047 Two Hands - Austin South Congress 187
## V12019 Two Hands - Austin South Congress 187
## V12105 Two Hands - Austin South Congress 187
## V12218 Two Hands - Austin South Congress 187
## V12548 Two Hands - Austin South Congress 187
## V12654 Two Hands - Austin South Congress 187
## V12655 Two Hands - Austin South Congress 187
## V13065 Two Hands - Austin South Congress 187
## V13068 Two Hands - Austin South Congress 187
## V13189 Two Hands - Austin South Congress 187
## V13652 Two Hands - Austin South Congress 187
## V14540 Two Hands - Austin South Congress 187
## V14789 Two Hands - Austin South Congress 187
## V15692 Two Hands - Austin South Congress 187
## V17398 Two Hands - Austin South Congress 187
## V18063 Two Hands - Austin South Congress 187
## V18476 Two Hands - Austin South Congress 187
## V18658 Two Hands - Austin South Congress 187
## V20711 Two Hands - Austin South Congress 187
## V20822 TenTen 135
## V20830 Devil May Care 134
## V21378 Two Hands - Austin South Congress 187
## V21664 Two Hands - Austin South Congress 187
## V22100 Two Hands - Austin South Congress 187
## V24308 Two Hands - Austin South Congress 187
## V24466 TenTen 135
## V24975 Two Hands - Austin South Congress 187
## V25139 Yardbird - Dallas 180
## V25221 Yardbird - Dallas 180
## V25450 Two Hands - Austin South Congress 187
## V26817 The Well 3266
## V27097 The Well 3266
## V27875 The Hampton Social - Streeterville 2611
## V29319 Two Hands - Austin South Congress 187
## V29883 Bluestone Lane (Manhattan West) 3169
## V31123 The Well 3266
## V31982 TenTen 135
## V33164 Two Hands - Austin South Congress 187
## V33384 Two Hands - Austin South Congress 187
## V34734 Two Hands - Austin South Congress 187
## V35045 TenTen 135
## V35046 TenTen 135
## V35053 The Well 3266
## V43267 District Kitchen Anderson Lane 3279
## V647.1 Two Hands - Austin South Congress 187
## V1384.1 TenTen 135
## V1773.1 El Pollo Verde 3374
## V3985.1 The Well 3266
## V4435.1 Two Hands - Austin South Congress 187
## V4436.1 Two Hands - Austin South Congress 187
## V6025.1 Two Hands - Austin South Congress 187
## V7223.1 Electric Jane 3346
## V7902.1 MARTA 3301
## V8185.1 Two Hands - NoHo 186
## V8432.1 Union Square Cafe 3298
## V8854.1 The Modern 3300
## V9155.1 The Concourse Project 3350
## V9198.1 Two Hands - Austin South Congress 187
## V9508.1 The Well 3266
## V13118.1 Two Hands - Williamsburg 185
## V14100.1 Two Hands - Austin South Congress 187
## V14657.1 The Well 3266
## V16035.1 District Kitchen Anderson Lane 3279
## V17675.1 Two Hands - Austin South Congress 187
## V18774.1 The Well 3266
## V18874.1 Two Hands - Austin South Congress 187
## V18935.1 The Well 3266
## V26849.1 CHICA - Las Vegas 168
## V27310.1 Kumi 3359
## V27361.1 S Bar LV 4529
## V31513.1 The Hampton Social - Streeterville 2611
## V31757.1 inKind Booth 4733
## V31758.1 inKind Booth 4733
## V31760.1 inKind Booth 4733
## V31761.1 inKind Booth 4733
## V31766.1 inKind Booth 4733
## V32323.1 The Hampton Social - Streeterville 2611
## V32680.1 The Hampton Social - River North 2616
## V34490.1 CHICA - Las Vegas 168
## V35046.1 Kumi 3359
## V36428.1 The Well 3266
## V38928.1 Mirame 4588
## V44599.1 Two Hands - Austin South Congress 187
## V48717 The Well 3266
## V53420 Two Hands - Austin South Congress 187
## V53657 TenTen 135
## V53877 City Winery - Riverwalk (IL) 3388
## V61652 Two Hands - Austin South Congress 187
## V67395 Black Seed Bagels - Nolita 4720
## V70657 Two Hands - Austin South Congress 187
## V71233 TenTen 135
## V74217 Two Hands - Austin South Congress 187
## V77336 All Day by Kramers 3329
## V77341 Bluestone Lane (West End Library) 3170
## V77563 Elcielo DC 182
## V77611 All Day by Kramers 3329
## V77933 All Day by Kramers 3329
## V80226 Juliet Italian Kitchen - Barton Springs 2603
## V81221 The Well 3266
## V81503 Two Hands - Austin South Congress 187
## V87422 TLC 2844
## V95428 Two Hands - Austin South Congress 187
## V97965 Two Hands - Austin South Congress 187
## V105806 Higher Ground, Austin 3263
## V107435 Two Hands - Austin South Congress 187
## V113859 Paperboy 4982
## V18171.2 The Concourse Project 3350
## V18189.2 The Concourse Project 3350
## city state credit_transaction_id total_redemption_amount
## V8333 Venice CA 257820 172.46
## V8334 Venice CA 257823 617.45
## V9553 Venice CA 260680 93.13
## V10277 Austin TX 262210 44.92
## V10517 Austin TX 262722 51.42
## V11047 Austin TX 263940 41.13
## V12019 Austin TX 266033 5.00
## V12105 Austin TX 266203 49.80
## V12218 Austin TX 266448 44.92
## V12548 Austin TX 267325 71.45
## V12654 Austin TX 267588 21.10
## V12655 Austin TX 267589 5.95
## V13065 Austin TX 268445 43.30
## V13068 Austin TX 268449 13.00
## V13189 Austin TX 268659 242.47
## V13652 Austin TX 269626 154.27
## V14540 Austin TX 271504 24.37
## V14789 Austin TX 271956 95.27
## V15692 Austin TX 273775 35.73
## V17398 Austin TX 277125 56.84
## V18063 Austin TX 278352 11.91
## V18476 Austin TX 279185 27.07
## V18658 Austin TX 279506 35.73
## V20711 Austin TX 283417 90.50
## V20822 Austin TX 283635 208.94
## V20830 Austin TX 283641 31.39
## V21378 Austin TX 284622 358.85
## V21664 Austin TX 285215 55.75
## V22100 Austin TX 286010 59.54
## V24308 Austin TX 290904 146.14
## V24466 Austin TX 291212 470.88
## V24975 Austin TX 292113 76.86
## V25139 Dallas TX 292467 86.60
## V25221 Dallas TX 292610 62.79
## V25450 Austin TX 293008 1.00
## V26817 Austin TX 296934 15.16
## V27097 Austin TX 297818 22.74
## V27875 Chicago IL 300028 71.52
## V29319 Austin TX 303985 42.22
## V29883 New York NY 305397 18.24
## V31123 Austin TX 309387 12.99
## V31982 Austin TX 311335 726.37
## V33164 Austin TX 315264 20.23
## V33384 Austin TX 315719 88.23
## V34734 Austin TX 319520 44.93
## V35045 Austin TX 321139 732.89
## V35046 Austin TX 321140 6.50
## V35053 Austin TX 321950 4.33
## V43267 Austin TX 360179 509.84
## V647.1 Austin TX 381607 80.11
## V1384.1 Austin TX 383523 373.48
## V1773.1 New York NY 385366 14.15
## V3985.1 Austin TX 391927 1.00
## V4435.1 Austin TX 393032 139.86
## V4436.1 Austin TX 393033 183.50
## V6025.1 Austin TX 396727 115.30
## V7223.1 Nashville TN 402351 1.00
## V7902.1 New York NY 403550 373.98
## V8185.1 New York NY 404489 1.00
## V8432.1 New York NY 405147 382.16
## V8854.1 New York NY 406080 263.54
## V9155.1 Austin TX 406770 1082.50
## V9198.1 Austin TX 406877 102.85
## V9508.1 Austin TX 407445 90.93
## V13118.1 Brooklyn NY 423476 13.61
## V14100.1 Austin TX 425957 81.18
## V14657.1 Austin TX 427347 10.82
## V16035.1 Austin TX 439326 203.50
## V17675.1 Austin TX 446377 77.39
## V18774.1 Austin TX 449768 5.41
## V18874.1 Austin TX 450304 37.35
## V18935.1 Austin TX 450449 68.21
## V26849.1 Las Vegas NV 479110 1075.08
## V27310.1 Las Vegas NV 480037 817.04
## V27361.1 Las Vegas NV 480067 531.13
## V31513.1 Chicago IL 499347 295.58
## V31757.1 Chicago IL 499812 1.00
## V31758.1 Chicago IL 499814 1.00
## V31760.1 Chicago IL 499817 1.00
## V31761.1 Chicago IL 499818 1.00
## V31766.1 Chicago IL 499833 2.00
## V32323.1 Chicago IL 501045 1.00
## V32680.1 Chicago IL 501723 1400.16
## V34490.1 Las Vegas NV 507122 741.28
## V35046.1 Las Vegas NV 508745 1313.18
## V36428.1 Austin TX 511685 86.61
## V38928.1 Beverly Hills CA 516819 10.00
## V44599.1 Austin TX 529927 61.70
## V48717 Austin TX 538626 38.97
## V53420 Austin TX 547911 48.73
## V53657 Austin TX 548386 637.59
## V53877 Chicago IL 548798 11.12
## V61652 Austin TX 563620 323.12
## V67395 New York NY 574588 34.79
## V70657 Austin TX 580745 71.45
## V71233 Austin TX 581823 794.55
## V74217 Austin TX 587348 70.90
## V77336 Washington DC 593227 19.25
## V77341 Washington DC 593233 6.38
## V77563 Washington DC 593574 187.70
## V77611 Washington DC 593709 6.05
## V77933 Washington DC 594333 6.05
## V80226 Austin TX 598738 48.71
## V81221 Austin TX 600768 67.12
## V81503 Austin TX 601390 62.24
## V87422 Austin TX 614497 1.00
## V95428 Austin TX 634308 252.23
## V97965 Austin TX 639958 148.85
## V105806 Austin TX 658666 81.19
## V107435 Austin TX 662718 59.75
## V113859 Austin TX 681053 24.48
## V18171.2 Austin TX 727149 45.47
## V18189.2 Austin TX 727206 45.47
## tip Venue.Type...Detail Check.Average Service.Type
## V8333 34.65 Casual Fine Dining High Full Service
## V8334 124.05 Casual Fine Dining High Full Service
## V9553 18.71 Casual Fine Dining High Full Service
## V10277 9.88 Casual Dining Mid Full Service
## V10517 11.31 Casual Dining Mid Full Service
## V11047 9.05 Casual Dining Mid Full Service
## V12019 1.25 Casual Dining Mid Full Service
## V12105 12.45 Casual Dining Mid Full Service
## V12218 11.23 Casual Dining Mid Full Service
## V12548 17.86 Casual Dining Mid Full Service
## V12654 5.28 Casual Dining Mid Full Service
## V12655 1.49 Casual Dining Mid Full Service
## V13065 10.82 Casual Dining Mid Full Service
## V13068 3.25 Casual Dining Mid Full Service
## V13189 60.62 Casual Dining Mid Full Service
## V13652 38.57 Casual Dining Mid Full Service
## V14540 6.09 Casual Dining Mid Full Service
## V14789 23.82 Casual Dining Mid Full Service
## V15692 8.93 Casual Dining Mid Full Service
## V17398 14.21 Casual Dining Mid Full Service
## V18063 2.98 Casual Dining Mid Full Service
## V18476 6.77 Casual Dining Mid Full Service
## V18658 8.93 Casual Dining Mid Full Service
## V20711 22.63 Casual Dining Mid Full Service
## V20822 52.23 Casual Fine Dining Mid Full Service
## V20830 6.91 Nightclub Mid Full Service
## V21378 71.77 Casual Dining Mid Full Service
## V21664 13.94 Casual Dining Mid Full Service
## V22100 14.88 Casual Dining Mid Full Service
## V24308 36.53 Casual Dining Mid Full Service
## V24466 117.72 Casual Fine Dining Mid Full Service
## V24975 19.21 Casual Dining Mid Full Service
## V25139 21.65 Casual Fine Dining Mid Full Service
## V25221 15.70 Casual Fine Dining Mid Full Service
## V25450 NA Casual Dining Mid Full Service
## V26817 3.79 Casual Fine Dining Mid Full Service
## V27097 5.68 Casual Fine Dining Mid Full Service
## V27875 17.88 Casual Fine Dining High Full Service
## V29319 10.55 Casual Dining Mid Full Service
## V29883 4.19 Coffee Shop Very Low QSR
## V31123 3.24 Casual Fine Dining Mid Full Service
## V31982 181.59 Casual Fine Dining Mid Full Service
## V33164 5.05 Casual Dining Mid Full Service
## V33384 22.05 Casual Dining Mid Full Service
## V34734 11.23 Casual Dining Mid Full Service
## V35045 183.22 Casual Fine Dining Mid Full Service
## V35046 4.00 Casual Fine Dining Mid Full Service
## V35053 1.00 Casual Fine Dining Mid Full Service
## V43267 127.46 Casual Dining Mid Full Service
## V647.1 20.02 Casual Dining Mid Full Service
## V1384.1 93.37 Casual Fine Dining Mid Full Service
## V1773.1 3.53 Fast Casual Mid QSR
## V3985.1 1.00 Casual Fine Dining Mid Full Service
## V4435.1 34.96 Casual Dining Mid Full Service
## V4436.1 45.88 Casual Dining Mid Full Service
## V6025.1 28.82 Casual Dining Mid Full Service
## V7223.1 1.00 Fine Dining Mid Full Service
## V7902.1 85.87 Casual Fine Dining Very High Full Service
## V8185.1 1.00 Casual Dining Mid Full Service
## V8432.1 87.75 Fine Dining Very High Full Service
## V8854.1 60.51 Fine Dining Very High Full Service
## V9155.1 250.00 Nightclub High Fast Casual
## V9198.1 22.62 Casual Dining Mid Full Service
## V9508.1 22.73 Casual Fine Dining Mid Full Service
## V13118.1 3.40 Casual Dining Mid Full Service
## V14100.1 20.29 Casual Dining Mid Full Service
## V14657.1 2.70 Casual Fine Dining Mid Full Service
## V16035.1 50.88 Casual Dining Mid Full Service
## V17675.1 19.35 Casual Dining Mid Full Service
## V18774.1 2.00 Casual Fine Dining Mid Full Service
## V18874.1 9.34 Casual Dining Mid Full Service
## V18935.1 17.05 Casual Fine Dining Mid Full Service
## V26849.1 188.28 Casual Fine Dining Mid Full Service
## V27310.1 147.07 Casual Fine Dining High Full Service
## V27361.1 106.23 Bar High Full Service
## V31513.1 65.03 Casual Fine Dining High Full Service
## V31757.1 NA Bar Mid QSR
## V31758.1 NA Bar Mid QSR
## V31760.1 NA Bar Mid QSR
## V31761.1 NA Bar Mid QSR
## V31766.1 NA Bar Mid QSR
## V32323.1 1.00 Casual Fine Dining High Full Service
## V32680.1 308.04 Casual Fine Dining High Full Service
## V34490.1 196.35 Casual Fine Dining Mid Full Service
## V35046.1 262.64 Casual Fine Dining High Full Service
## V36428.1 17.60 Casual Fine Dining Mid Full Service
## V38928.1 2.20 Casual Fine Dining High Full Service
## V44599.1 11.40 Casual Dining Mid Full Service
## V48717 7.92 Casual Fine Dining Mid Full Service
## V53420 8.10 Casual Dining Mid Full Service
## V53657 117.80 Casual Fine Dining Mid Full Service
## V53877 2.20 Casual Fine Dining High Full Service
## V61652 65.67 Casual Dining Mid Full Service
## V67395 7.65 Fast Casual Mid QSR
## V70657 14.52 Casual Dining Mid Full Service
## V71233 161.48 Casual Fine Dining Mid Full Service
## V74217 14.41 Casual Dining Mid Full Service
## V77336 3.85 Casual Dining Mid Full Service
## V77341 1.04 Coffee Shop Very Low QSR
## V77563 100.00 Fine Dining Very High Full Service
## V77611 2.00 Casual Dining Mid Full Service
## V77933 2.00 Casual Dining Mid Full Service
## V80226 5.00 Unknown Mid Unknown
## V81221 12.40 Casual Fine Dining Mid Full Service
## V81503 12.65 Casual Dining Mid Full Service
## V87422 NA Unknown Mid Unknown
## V95428 51.26 Casual Dining Mid Full Service
## V97965 30.25 Casual Dining Mid Full Service
## V105806 16.50 Bar Mid Full Service
## V107435 12.14 Casual Dining Mid Full Service
## V113859 4.99 Casual Dining Low Full Service
## V18171.2 8.40 Nightclub High Fast Casual
## V18189.2 8.40 Nightclub High Fast Casual
filter(df_users_thru_jan23, user_id == "18183")
## user_id account_created_at zip_code user_app_version user_app_platform
## V14329 18183 2019-11-05 20:13:52 <NA> 6.4.17.470 ios
user_id: 25670filter(df_revenue_view, user_id == "25670")
## UID name project_id gcp_id ict_id
## V1116 33930g Paraiso 255 33930 <NA>
## V1326 34227g Paraiso 255 34227 <NA>
## V4357 37954g Paraiso 255 37954 <NA>
## V6791 41004g Paraiso 255 41004 <NA>
## V14238 50088g Jose Andres Restaurants 708 50088 <NA>
## V24510 63089g Pluma by Bluebird Bakery 11 63089 <NA>
## V27835 67113g Paraiso 255 67113 <NA>
## V2397.1 74468g Paraiso 255 74468 <NA>
## V11107.1 84869g Jose Andres Restaurants 708 84869 <NA>
## V11270.1 85056g Paraiso 255 85056 <NA>
## V11271.1 85057g Bluestone Lane 699 85057 <NA>
## V21833.1 96962g Bluestone Lane 699 96962 <NA>
## V51551 i32971 inKind Pass -999 <NA> 32971
## created_at amount_charged_in_usd utm_campaign
## V1116 2021-01-23 17:16:42 250.00 <NA>
## V1326 2021-01-28 13:07:52 500.00 <NA>
## V4357 2021-03-19 23:40:17 250.00 <NA>
## V6791 2021-04-30 00:40:27 250.00 <NA>
## V14238 2021-07-31 15:54:10 250.00 <NA>
## V24510 2021-11-19 13:25:49 100.00
## V27835 2021-12-11 17:24:13 21.51 <NA>
## V2397.1 2022-01-29 17:19:14 250.00 <NA>
## V11107.1 2022-04-21 22:48:57 11.60 <NA>
## V11270.1 2022-04-23 03:07:57 250.00 2022-04-monthly-merchant
## V11271.1 2022-04-23 03:09:42 100.00 <NA>
## V21833.1 2022-06-20 12:21:21 250.00 <NA>
## V51551 2022-11-17 13:56:10 499.00 ikp-launch
## utm_medium utm_content utm_source is_app_purchase user_id
## V1116 <NA> <NA> <NA> 0 25670
## V1326 <NA> <NA> <NA> 0 25670
## V4357 <NA> <NA> <NA> 0 25670
## V6791 <NA> <NA> <NA> 0 25670
## V14238 <NA> <NA> <NA> 0 25670
## V24510 0 25670
## V27835 <NA> <NA> <NA> 0 25670
## V2397.1 <NA> <NA> <NA> 1 25670
## V11107.1 <NA> <NA> <NA> 0 25670
## V11270.1 email combo 0 25670
## V11271.1 <NA> <NA> <NA> 1 25670
## V21833.1 <NA> <NA> <NA> 1 25670
## V51551 sms finaloffer houseaccountholders 0 25670
## transaction_type credit_type credit_given_in_usd is_excess
## V1116 1 0 300.00 <NA>
## V1326 1 0 675.00 <NA>
## V4357 1 0 300.00 <NA>
## V6791 1 0 350.00 <NA>
## V14238 1 0 330.00 <NA>
## V24510 1 0 140.00 <NA>
## V27835 1 0 21.51 1
## V2397.1 1 0 300.00 <NA>
## V11107.1 1 0 11.60 1
## V11270.1 1 0 338.00 <NA>
## V11271.1 1 0 120.00 <NA>
## V21833.1 1 0 325.00 <NA>
## V51551 1 0 700.00 <NA>
## stripe_brand option_id
## V1116 MasterCard 8234
## V1326 MasterCard 9923
## V4357 MasterCard 8234
## V6791 MasterCard 9922
## V14238 MasterCard 13581
## V24510 MasterCard 16394
## V27835 MasterCard 17369
## V2397.1 MasterCard 8234
## V11107.1 MasterCard 15030
## V11270.1 MasterCard 22730
## V11271.1 MasterCard 16035
## V21833.1 MasterCard 11851
## V51551 MasterCard 38
filter(df_redemptions, user_id == "25670")
## user_id created_at project_id project.name
## V1245 25670 2021-01-16 13:01:44 255 Paraiso
## V1850 25670 2021-01-23 13:03:21 255 Paraiso
## V2251 25670 2021-01-28 20:00:38 255 Paraiso
## V3238 25670 2021-02-06 12:33:59 255 Paraiso
## V3988 25670 2021-02-13 12:39:51 255 Paraiso
## V4700 25670 2021-02-20 13:50:57 255 Paraiso
## V5184 25670 2021-02-25 20:33:57 255 Paraiso
## V5533 25670 2021-02-28 16:43:25 255 Paraiso
## V6607 25670 2021-03-13 12:23:40 255 Paraiso
## V7225 25670 2021-03-19 19:58:07 255 Paraiso
## V9184 25670 2021-04-10 12:15:47 255 Paraiso
## V11310 25670 2021-05-01 10:17:15 255 Paraiso
## V13100 25670 2021-05-15 13:47:56 255 Paraiso
## V20767 25670 2021-07-15 15:41:51 255 Paraiso
## V21905 25670 2021-07-24 14:09:03 255 Paraiso
## V21906 25670 2021-07-24 14:15:25 255 Paraiso
## V31060 25670 2021-09-29 21:35:20 708 Jose Andres Restaurants
## V35430 25670 2021-10-30 12:09:52 255 Paraiso
## V42363 25670 2021-12-11 12:24:16 255 Paraiso
## V42403 25670 2021-12-11 13:38:54 11 Pluma by Bluebird Bakery
## V4733.1 25670 2022-01-29 12:20:26 255 Paraiso
## V4735.1 25670 2022-01-29 12:21:39 255 Paraiso
## V8946.1 25670 2022-02-18 16:38:00 255 Paraiso
## V10098.1 25670 2022-02-23 18:52:13 708 Jose Andres Restaurants
## V12113.1 25670 2022-03-05 11:48:44 255 Paraiso
## V12457.1 25670 2022-03-06 12:03:28 11 Pluma by Bluebird Bakery
## V22233.1 25670 2022-04-21 18:48:59 708 Jose Andres Restaurants
## V25559.1 25670 2022-05-02 09:44:59 699 Bluestone Lane
## V27830.1 25670 2022-05-09 10:39:52 699 Bluestone Lane
## V28279.1 25670 2022-05-11 08:45:54 699 Bluestone Lane
## V30071.1 25670 2022-05-15 18:28:43 255 Paraiso
## V30349.1 25670 2022-05-17 08:54:05 699 Bluestone Lane
## V36334.1 25670 2022-05-31 09:11:01 699 Bluestone Lane
## V36865.1 25670 2022-06-01 08:55:32 699 Bluestone Lane
## V37107.1 25670 2022-06-02 08:36:03 699 Bluestone Lane
## V38441.1 25670 2022-06-07 08:33:40 699 Bluestone Lane
## V38857.1 25670 2022-06-09 08:28:23 699 Bluestone Lane
## V40349.1 25670 2022-06-13 07:30:14 699 Bluestone Lane
## V40799.1 25670 2022-06-15 09:28:29 699 Bluestone Lane
## V41064.1 25670 2022-06-16 08:30:03 699 Bluestone Lane
## V42535.1 25670 2022-06-20 08:19:59 699 Bluestone Lane
## V42739.1 25670 2022-06-21 08:22:08 699 Bluestone Lane
## V43256.1 25670 2022-06-23 08:18:23 699 Bluestone Lane
## V45110.1 25670 2022-06-28 08:28:09 699 Bluestone Lane
## V47295 25670 2022-07-05 10:23:10 699 Bluestone Lane
## V48107 25670 2022-07-08 10:37:48 699 Bluestone Lane
## V49128 25670 2022-07-11 09:12:18 699 Bluestone Lane
## V51887 25670 2022-07-22 10:01:38 699 Bluestone Lane
## V52967 25670 2022-07-25 09:04:22 699 Bluestone Lane
## V53418 25670 2022-07-27 08:18:20 699 Bluestone Lane
## V53700 25670 2022-07-28 09:09:16 699 Bluestone Lane
## V55364 25670 2022-08-03 10:06:05 699 Bluestone Lane
## V55559 25670 2022-08-04 08:57:08 699 Bluestone Lane
## V55804 25670 2022-08-05 09:51:45 699 Bluestone Lane
## V56724 25670 2022-08-08 09:36:54 699 Bluestone Lane
## V56912 25670 2022-08-09 10:12:10 699 Bluestone Lane
## V57105 25670 2022-08-10 09:47:39 699 Bluestone Lane
## V57335 25670 2022-08-11 07:22:29 699 Bluestone Lane
## V57578 25670 2022-08-12 09:30:04 699 Bluestone Lane
## V58542 25670 2022-08-15 09:19:42 699 Bluestone Lane
## V59179 25670 2022-08-18 08:01:23 699 Bluestone Lane
## V60154 25670 2022-08-21 11:33:03 11 Pluma by Bluebird Bakery
## V60426 25670 2022-08-22 11:13:57 699 Bluestone Lane
## V61297 25670 2022-08-26 12:35:32 699 Bluestone Lane
## V62912 25670 2022-09-02 10:59:57 699 Bluestone Lane
## V63992 25670 2022-09-06 11:14:40 699 Bluestone Lane
## V63993 25670 2022-09-06 11:23:33 699 Bluestone Lane
## V64910 25670 2022-09-10 11:56:34 699 Bluestone Lane
## V65667 25670 2022-09-13 10:35:23 699 Bluestone Lane
## V66042 25670 2022-09-15 09:37:42 699 Bluestone Lane
## V67339 25670 2022-09-20 08:46:44 699 Bluestone Lane
## V67742 25670 2022-09-22 08:41:56 699 Bluestone Lane
## V69925 25670 2022-09-30 12:55:28 699 Bluestone Lane
## V79222 25670 2022-10-31 11:44:04 699 Bluestone Lane
## V86376 25670 2022-11-17 08:56:50 699 Bluestone Lane
## V86943 25670 2022-11-18 09:35:48 699 Bluestone Lane
## V88051 25670 2022-11-19 13:22:24 255 Paraiso
## V89786 25670 2022-11-21 09:32:26 699 Bluestone Lane
## V93669 25670 2022-11-27 13:33:44 255 Paraiso
## V93675 25670 2022-11-27 13:37:40 255 Paraiso
## V94642 25670 2022-11-29 12:14:41 699 Bluestone Lane
## V95571 25670 2022-12-01 10:21:48 699 Bluestone Lane
## V96216 25670 2022-12-02 13:04:50 699 Bluestone Lane
## V104105 25670 2022-12-14 12:21:00 699 Bluestone Lane
## V104613 25670 2022-12-15 10:59:37 699 Bluestone Lane
## V105196 25670 2022-12-16 10:47:14 699 Bluestone Lane
## V109721 25670 2022-12-22 10:10:42 699 Bluestone Lane
## V112980 25670 2022-12-28 09:45:59 699 Bluestone Lane
## V115492 25670 2022-12-31 10:36:52 699 Bluestone Lane
## V1285.2 25670 2023-01-03 10:29:28 699 Bluestone Lane
## V4851.2 25670 2023-01-08 10:04:23 699 Bluestone Lane
## V10894.2 25670 2023-01-17 10:10:24 699 Bluestone Lane
## V11415.2 25670 2023-01-18 12:27:15 699 Bluestone Lane
## V12495.2 25670 2023-01-20 12:27:18 699 Bluestone Lane
## V17378.2 25670 2023-01-27 10:18:12 699 Bluestone Lane
## Location project_location_id city state
## V1245 Paraiso 171 Washington DC
## V1850 Paraiso 171 Washington DC
## V2251 Paraiso 171 Washington DC
## V3238 Paraiso 171 Washington DC
## V3988 Paraiso 171 Washington DC
## V4700 Paraiso 171 Washington DC
## V5184 Paraiso 171 Washington DC
## V5533 Paraiso 171 Washington DC
## V6607 Paraiso 171 Washington DC
## V7225 Paraiso 171 Washington DC
## V9184 Paraiso 171 Washington DC
## V11310 Paraiso 171 Washington DC
## V13100 Paraiso 171 Washington DC
## V20767 Paraiso 171 Washington DC
## V21905 Paraiso 171 Washington DC
## V21906 Paraiso 171 Washington DC
## V31060 China Chilcano DC 3245 Washington DC
## V35430 Paraiso 171 Washington DC
## V42363 Paraiso 171 Washington DC
## V42403 Pluma by Bluebird Bakery 2653 Washington DC
## V4733.1 Paraiso 171 Washington DC
## V4735.1 Paraiso 171 Washington DC
## V8946.1 Paraiso 171 Washington DC
## V10098.1 China Chilcano DC 3245 Washington DC
## V12113.1 Paraiso 171 Washington DC
## V12457.1 Pluma by Bluebird Bakery 2653 Washington DC
## V22233.1 China Chilcano DC 3245 Washington DC
## V25559.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V27830.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V28279.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V30071.1 Paraiso 171 Washington DC
## V30349.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V36334.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V36865.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V37107.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V38441.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V38857.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V40349.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V40799.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V41064.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V42535.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V42739.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V43256.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V45110.1 Bluestone Lane (Navy Yard) 3198 Washington DC
## V47295 Bluestone Lane (Navy Yard) 3198 Washington DC
## V48107 Bluestone Lane (Navy Yard) 3198 Washington DC
## V49128 Bluestone Lane (Navy Yard) 3198 Washington DC
## V51887 Bluestone Lane (Navy Yard) 3198 Washington DC
## V52967 Bluestone Lane (Navy Yard) 3198 Washington DC
## V53418 Bluestone Lane (Navy Yard) 3198 Washington DC
## V53700 Bluestone Lane (Navy Yard) 3198 Washington DC
## V55364 Bluestone Lane (Navy Yard) 3198 Washington DC
## V55559 Bluestone Lane (Navy Yard) 3198 Washington DC
## V55804 Bluestone Lane (Navy Yard) 3198 Washington DC
## V56724 Bluestone Lane (Navy Yard) 3198 Washington DC
## V56912 Bluestone Lane (Navy Yard) 3198 Washington DC
## V57105 Bluestone Lane (Navy Yard) 3198 Washington DC
## V57335 Bluestone Lane (Navy Yard) 3198 Washington DC
## V57578 Bluestone Lane (Navy Yard) 3198 Washington DC
## V58542 Bluestone Lane (Navy Yard) 3198 Washington DC
## V59179 Bluestone Lane (Navy Yard) 3198 Washington DC
## V60154 Pluma by Bluebird Bakery 2653 Washington DC
## V60426 Bluestone Lane (Navy Yard) 3198 Washington DC
## V61297 Bluestone Lane (Navy Yard) 3198 Washington DC
## V62912 Bluestone Lane (Navy Yard) 3198 Washington DC
## V63992 Bluestone Lane (Navy Yard) 3198 Washington DC
## V63993 Bluestone Lane (Navy Yard) 3198 Washington DC
## V64910 Bluestone Lane (Navy Yard) 3198 Washington DC
## V65667 Bluestone Lane (Navy Yard) 3198 Washington DC
## V66042 Bluestone Lane (Navy Yard) 3198 Washington DC
## V67339 Bluestone Lane (Navy Yard) 3198 Washington DC
## V67742 Bluestone Lane (Navy Yard) 3198 Washington DC
## V69925 Bluestone Lane (Navy Yard) 3198 Washington DC
## V79222 Bluestone Lane (Navy Yard) 3198 Washington DC
## V86376 Bluestone Lane (Navy Yard) 3198 Washington DC
## V86943 Bluestone Lane (Navy Yard) 3198 Washington DC
## V88051 Paraiso 171 Washington DC
## V89786 Bluestone Lane (Navy Yard) 3198 Washington DC
## V93669 Paraiso 171 Washington DC
## V93675 Paraiso 171 Washington DC
## V94642 Bluestone Lane (Navy Yard) 3198 Washington DC
## V95571 Bluestone Lane (Navy Yard) 3198 Washington DC
## V96216 Bluestone Lane (Navy Yard) 3198 Washington DC
## V104105 Bluestone Lane (Navy Yard) 3198 Washington DC
## V104613 Bluestone Lane (Navy Yard) 3198 Washington DC
## V105196 Bluestone Lane (Navy Yard) 3198 Washington DC
## V109721 Bluestone Lane (Navy Yard) 3198 Washington DC
## V112980 Bluestone Lane (Navy Yard) 3198 Washington DC
## V115492 Bluestone Lane (Navy Yard) 3198 Washington DC
## V1285.2 Bluestone Lane (Navy Yard) 3198 Washington DC
## V4851.2 Bluestone Lane (Navy Yard) 3198 Washington DC
## V10894.2 Bluestone Lane (Navy Yard) 3198 Washington DC
## V11415.2 Bluestone Lane (Navy Yard) 3198 Washington DC
## V12495.2 Bluestone Lane (Navy Yard) 3198 Washington DC
## V17378.2 Bluestone Lane (Navy Yard) 3198 Washington DC
## credit_transaction_id total_redemption_amount tip
## V1245 240783 46.64 9.33
## V1850 242310 121.72 NA
## V2251 243412 135.74 27.15
## V3238 246224 62.48 12.50
## V3988 247895 142.34 31.31
## V4700 249400 146.30 29.26
## V5184 250537 213.40 42.68
## V5533 251241 77.44 15.49
## V6607 253757 116.60 23.32
## V7225 255123 45.10 9.02
## V9184 259824 77.44 15.49
## V11310 264530 77.44 15.49
## V13100 268466 77.44 15.49
## V20767 283514 70.40 12.67
## V21905 285642 99.55 19.91
## V21906 285644 77.44 13.94
## V31060 309011 152.90 38.22
## V35430 322991 80.30 16.05
## V42363 356247 84.48 15.20
## V42403 356311 22.00 3.96
## V4733.1 393675 84.48 3.00
## V4735.1 393678 38.50 NA
## V8946.1 406377 84.48 4.00
## V10098.1 408931 124.30 24.86
## V12113.1 418387 77.44 4.00
## V12457.1 418993 20.00 2.00
## V22233.1 461038 114.40 20.80
## V25559.1 472999 5.61 0.92
## V27830.1 480984 5.61 0.92
## V28279.1 486593 16.06 2.63
## V30071.1 490539 77.44 6.00
## V30349.1 491563 5.61 0.92
## V36334.1 511457 5.61 0.92
## V36865.1 512641 5.61 0.92
## V37107.1 513146 5.61 0.92
## V38441.1 515626 5.61 0.92
## V38857.1 516474 5.61 0.92
## V40349.1 520201 11.22 1.84
## V40799.1 521289 5.06 0.83
## V41064.1 521853 11.22 1.84
## V42535.1 525201 16.06 2.63
## V42739.1 525632 5.61 0.92
## V43256.1 526911 11.22 1.84
## V45110.1 531029 11.22 1.84
## V47295 535654 11.22 1.84
## V48107 537416 11.22 1.84
## V49128 539396 11.22 1.84
## V51887 544916 11.22 1.84
## V52967 547033 11.22 1.84
## V53418 547898 5.61 0.92
## V53700 548464 11.22 1.84
## V55364 551888 11.22 1.84
## V55559 552282 5.61 0.92
## V55804 552724 11.22 1.84
## V56724 554383 5.61 0.92
## V56912 554749 5.61 0.92
## V57105 555116 16.06 2.63
## V57335 555514 11.22 1.84
## V57578 555944 11.22 1.84
## V58542 557818 5.61 0.92
## V59179 559046 11.22 1.84
## V60154 560865 22.00 NA
## V60426 561363 5.61 0.92
## V61297 562906 5.61 0.92
## V62912 566045 21.67 3.55
## V63992 568286 15.79 2.58
## V63993 568288 5.61 0.92
## V64910 569928 11.22 1.84
## V65667 571395 5.61 0.92
## V66042 572146 16.06 2.63
## V67339 574518 5.61 0.92
## V67742 575236 5.61 0.92
## V69925 579418 16.06 2.63
## V79222 596767 16.06 2.63
## V86376 612060 17.60 2.88
## V86943 613411 21.78 3.56
## V88051 615813 110.00 20.00
## V89786 620147 20.74 3.39
## V93669 629633 81.40 13.32
## V93675 629640 84.48 4.00
## V94642 632577 5.61 0.92
## V95571 634680 18.54 3.03
## V96216 636030 6.55 1.07
## V104105 654285 22.28 3.64
## V104613 655734 9.63 1.58
## V105196 657201 9.63 1.00
## V109721 669097 9.63 1.00
## V112980 678959 11.39 1.86
## V115492 684734 11.39 1.86
## V1285.2 689741 19.47 2.00
## V4851.2 697550 11.39 1.86
## V10894.2 711030 9.63 1.58
## V11415.2 712147 9.63 1.00
## V12495.2 714350 9.63 1.00
## V17378.2 725461 9.63 1.00
## Venue.Type...Detail Check.Average Service.Type
## V1245 Casual Dining Mid Full Service
## V1850 Casual Dining Mid Full Service
## V2251 Casual Dining Mid Full Service
## V3238 Casual Dining Mid Full Service
## V3988 Casual Dining Mid Full Service
## V4700 Casual Dining Mid Full Service
## V5184 Casual Dining Mid Full Service
## V5533 Casual Dining Mid Full Service
## V6607 Casual Dining Mid Full Service
## V7225 Casual Dining Mid Full Service
## V9184 Casual Dining Mid Full Service
## V11310 Casual Dining Mid Full Service
## V13100 Casual Dining Mid Full Service
## V20767 Casual Dining Mid Full Service
## V21905 Casual Dining Mid Full Service
## V21906 Casual Dining Mid Full Service
## V31060 Casual Dining High Full Service
## V35430 Casual Dining Mid Full Service
## V42363 Casual Dining Mid Full Service
## V42403 Coffee Shop Very Low QSR
## V4733.1 Casual Dining Mid Full Service
## V4735.1 Casual Dining Mid Full Service
## V8946.1 Casual Dining Mid Full Service
## V10098.1 Casual Dining High Full Service
## V12113.1 Casual Dining Mid Full Service
## V12457.1 Coffee Shop Very Low QSR
## V22233.1 Casual Dining High Full Service
## V25559.1 Coffee Shop Very Low QSR
## V27830.1 Coffee Shop Very Low QSR
## V28279.1 Coffee Shop Very Low QSR
## V30071.1 Casual Dining Mid Full Service
## V30349.1 Coffee Shop Very Low QSR
## V36334.1 Coffee Shop Very Low QSR
## V36865.1 Coffee Shop Very Low QSR
## V37107.1 Coffee Shop Very Low QSR
## V38441.1 Coffee Shop Very Low QSR
## V38857.1 Coffee Shop Very Low QSR
## V40349.1 Coffee Shop Very Low QSR
## V40799.1 Coffee Shop Very Low QSR
## V41064.1 Coffee Shop Very Low QSR
## V42535.1 Coffee Shop Very Low QSR
## V42739.1 Coffee Shop Very Low QSR
## V43256.1 Coffee Shop Very Low QSR
## V45110.1 Coffee Shop Very Low QSR
## V47295 Coffee Shop Very Low QSR
## V48107 Coffee Shop Very Low QSR
## V49128 Coffee Shop Very Low QSR
## V51887 Coffee Shop Very Low QSR
## V52967 Coffee Shop Very Low QSR
## V53418 Coffee Shop Very Low QSR
## V53700 Coffee Shop Very Low QSR
## V55364 Coffee Shop Very Low QSR
## V55559 Coffee Shop Very Low QSR
## V55804 Coffee Shop Very Low QSR
## V56724 Coffee Shop Very Low QSR
## V56912 Coffee Shop Very Low QSR
## V57105 Coffee Shop Very Low QSR
## V57335 Coffee Shop Very Low QSR
## V57578 Coffee Shop Very Low QSR
## V58542 Coffee Shop Very Low QSR
## V59179 Coffee Shop Very Low QSR
## V60154 Coffee Shop Very Low QSR
## V60426 Coffee Shop Very Low QSR
## V61297 Coffee Shop Very Low QSR
## V62912 Coffee Shop Very Low QSR
## V63992 Coffee Shop Very Low QSR
## V63993 Coffee Shop Very Low QSR
## V64910 Coffee Shop Very Low QSR
## V65667 Coffee Shop Very Low QSR
## V66042 Coffee Shop Very Low QSR
## V67339 Coffee Shop Very Low QSR
## V67742 Coffee Shop Very Low QSR
## V69925 Coffee Shop Very Low QSR
## V79222 Coffee Shop Very Low QSR
## V86376 Coffee Shop Very Low QSR
## V86943 Coffee Shop Very Low QSR
## V88051 Casual Dining Mid Full Service
## V89786 Coffee Shop Very Low QSR
## V93669 Casual Dining Mid Full Service
## V93675 Casual Dining Mid Full Service
## V94642 Coffee Shop Very Low QSR
## V95571 Coffee Shop Very Low QSR
## V96216 Coffee Shop Very Low QSR
## V104105 Coffee Shop Very Low QSR
## V104613 Coffee Shop Very Low QSR
## V105196 Coffee Shop Very Low QSR
## V109721 Coffee Shop Very Low QSR
## V112980 Coffee Shop Very Low QSR
## V115492 Coffee Shop Very Low QSR
## V1285.2 Coffee Shop Very Low QSR
## V4851.2 Coffee Shop Very Low QSR
## V10894.2 Coffee Shop Very Low QSR
## V11415.2 Coffee Shop Very Low QSR
## V12495.2 Coffee Shop Very Low QSR
## V17378.2 Coffee Shop Very Low QSR
filter(df_users_thru_jan23, user_id == "25670")
## user_id account_created_at zip_code user_app_version user_app_platform
## V19393 25670 2020-08-08 16:06:13 <NA> 6.4.13.422 ios
user_id: 40771filter(df_revenue_view, user_id == "40771")
## UID name project_id gcp_id ict_id
## V5295 39127g The Market District 277 39127 <NA>
## V5531 39472g Two Hands 687 39472 <NA>
## V5632 39615g 50 Eggs Hospitality Group 676 39615 <NA>
## V6844 41067g 50 Eggs Hospitality Group 676 41067 <NA>
## V8499 43144g Two Hands 687 43144 <NA>
## V10267 45290g Two Hands 687 45290 <NA>
## V11158 46426g The Market District 277 46426 <NA>
## V11203 46475g Two Hands 687 46475 <NA>
## V13630 49412g The Market District 277 49412 <NA>
## V14174 50019g The Market District 277 50019 <NA>
## V15270 51276g The Market District 277 51276 <NA>
## V16014 52234g The Market District 277 52234 <NA>
## V17021 53502g The Market District 277 53502 <NA>
## V19719 56985g The Market District 277 56985 <NA>
## V21782 59613g 50 Eggs Hospitality Group 676 59613 <NA>
## V1223.1 73050g Two Hands 687 73050 <NA>
## V1690.1 73628g Two Hands 687 73628 <NA>
## V2733.1 74843g The Concourse Project 721 74843 <NA>
## V3076.1 75241g The Market District 277 75241 <NA>
## V4991.1 77531g The Market District 277 77531 <NA>
## V6440.1 79294g Two Hands 687 79294 <NA>
## V6444.1 79298g Two Hands 687 79298 <NA>
## V7126.1 80176g The Market District 277 80176 <NA>
## V8751.1 82081g Two Hands 687 82081 <NA>
## V9140.1 82520g The Market District 277 82520 <NA>
## V14263.1 88418g The Concourse Project 721 88418 <NA>
## V15418.1 89740g The Market District 277 89740 <NA>
## V20426.1 95386g Bluestone Lane 699 95386 <NA>
## V27685.1 103673g Parched Hospitality Group 745 103673 <NA>
## V28983.1 105101g Union Square Hospitality Group 716 105101 <NA>
## V29860.1 106111g Parched Hospitality Group 745 106111 <NA>
## V30168.1 106459g Union Square Hospitality Group 716 106459 <NA>
## V32787 109474g The Market District 277 109474 <NA>
## V33009 i20765 inKind Pass -999 <NA> 20765
## V36304 i21120 inKind Pass -999 <NA> 21120
## created_at amount_charged_in_usd utm_campaign utm_medium
## V5295 2021-04-08 00:45:54 250.00 <NA> <NA>
## V5531 2021-04-13 01:53:38 250.00 <NA> <NA>
## V5632 2021-04-15 17:56:18 500.00 <NA> <NA>
## V6844 2021-04-30 03:07:18 500.00 <NA> <NA>
## V8499 2021-05-21 18:01:18 20.53 <NA> <NA>
## V10267 2021-06-08 00:34:43 250.00 <NA> <NA>
## V11158 2021-06-20 02:04:12 500.00 <NA> <NA>
## V11203 2021-06-20 17:06:51 250.00 <NA> <NA>
## V13630 2021-07-27 02:22:17 250.00 <NA> <NA>
## V14174 2021-07-31 02:37:03 250.00 <NA> <NA>
## V15270 2021-08-09 02:25:49 500.00 <NA> <NA>
## V16014 2021-08-20 02:43:05 250.00 <NA> <NA>
## V17021 2021-08-31 01:09:07 250.00 <NA> <NA>
## V19719 2021-09-30 02:28:21 1000.00 <NA> <NA>
## V21782 2021-10-25 00:32:26 250.00 <NA> <NA>
## V1223.1 2022-01-17 17:03:14 250.00 <NA> <NA>
## V1690.1 2022-01-23 02:22:11 250.00 <NA> <NA>
## V2733.1 2022-02-01 05:59:03 500.00 <NA> <NA>
## V3076.1 2022-02-05 03:58:16 250.00 <NA> <NA>
## V4991.1 2022-02-20 18:35:42 250.00 <NA> <NA>
## V6440.1 2022-03-09 01:12:41 250.00 <NA> <NA>
## V6444.1 2022-03-09 02:00:53 78.28 <NA> <NA>
## V7126.1 2022-03-18 02:00:17 500.00 <NA> <NA>
## V8751.1 2022-03-31 18:13:26 250.00 <NA> <NA>
## V9140.1 2022-04-03 03:21:15 250.00 <NA> <NA>
## V14263.1 2022-05-11 22:03:25 500.00 <NA> <NA>
## V15418.1 2022-05-18 00:16:25 250.00 <NA> <NA>
## V20426.1 2022-06-11 15:57:18 50.00 <NA> <NA>
## V27685.1 2022-07-29 03:03:34 250.00 <NA> <NA>
## V28983.1 2022-08-06 23:11:37 500.00 <NA> <NA>
## V29860.1 2022-08-14 18:10:33 250.00 <NA> <NA>
## V30168.1 2022-08-17 02:08:57 56.43 <NA> <NA>
## V32787 2022-09-06 02:37:21 126.94 <NA> <NA>
## V33009 2022-09-09 00:13:02 499.00 <NA> <NA>
## V36304 2022-09-30 22:59:55 499.00 <NA> <NA>
## utm_content utm_source is_app_purchase user_id transaction_type
## V5295 <NA> <NA> 0 40771 1
## V5531 <NA> <NA> 0 40771 1
## V5632 <NA> <NA> 0 40771 1
## V6844 <NA> <NA> 0 40771 1
## V8499 <NA> <NA> 0 40771 1
## V10267 <NA> <NA> 0 40771 1
## V11158 <NA> <NA> 0 40771 1
## V11203 <NA> <NA> 0 40771 1
## V13630 <NA> <NA> 0 40771 1
## V14174 <NA> <NA> 0 40771 1
## V15270 <NA> <NA> 0 40771 1
## V16014 <NA> <NA> 0 40771 1
## V17021 <NA> <NA> 0 40771 1
## V19719 <NA> <NA> 0 40771 1
## V21782 <NA> <NA> 0 40771 1
## V1223.1 <NA> <NA> 1 40771 1
## V1690.1 <NA> <NA> 1 40771 1
## V2733.1 <NA> <NA> 1 40771 1
## V3076.1 <NA> <NA> 1 40771 1
## V4991.1 <NA> <NA> 1 40771 1
## V6440.1 <NA> <NA> 1 40771 1
## V6444.1 <NA> <NA> 0 40771 1
## V7126.1 <NA> <NA> 1 40771 1
## V8751.1 <NA> <NA> 1 40771 1
## V9140.1 <NA> <NA> 1 40771 1
## V14263.1 <NA> <NA> 1 40771 1
## V15418.1 <NA> <NA> 1 40771 1
## V20426.1 <NA> <NA> 1 40771 1
## V27685.1 <NA> <NA> 1 40771 1
## V28983.1 <NA> <NA> 1 40771 1
## V29860.1 <NA> <NA> 1 40771 1
## V30168.1 <NA> <NA> 0 40771 1
## V32787 <NA> <NA> 0 40771 1
## V33009 <NA> <NA> 1 40771 1
## V36304 <NA> <NA> 1 40771 1
## credit_type credit_given_in_usd is_excess stripe_brand option_id
## V5295 0 300.00 <NA> Visa 6015
## V5531 0 300.00 <NA> Visa 10743
## V5632 0 625.00 <NA> Visa 8115
## V6844 0 625.00 <NA> Visa 8115
## V8499 0 20.53 1 Visa 11901
## V10267 0 300.00 <NA> Visa 10743
## V11158 0 625.00 <NA> Visa 4919
## V11203 0 300.00 <NA> Visa 10743
## V13630 0 300.00 <NA> Visa 6015
## V14174 0 300.00 <NA> Visa 6015
## V15270 0 625.00 <NA> Visa 4919
## V16014 0 300.00 <NA> Visa 6015
## V17021 0 300.00 <NA> Visa 6015
## V19719 0 1300.00 <NA> Visa 9201
## V21782 0 300.00 <NA> Visa 8114
## V1223.1 0 275.00 <NA> Visa 16057
## V1690.1 0 275.00 <NA> Visa 16057
## V2733.1 0 600.00 <NA> Visa 16095
## V3076.1 0 275.00 <NA> Visa 16099
## V4991.1 0 275.00 <NA> Visa 16099
## V6440.1 0 275.00 <NA> Visa 16057
## V6444.1 0 78.28 1 Visa 21180
## V7126.1 0 575.00 <NA> Visa 16004
## V8751.1 0 275.00 <NA> Visa 16057
## V9140.1 0 275.00 <NA> Visa 16099
## V14263.1 0 600.00 <NA> Visa 16095
## V15418.1 0 275.00 <NA> Visa 16099
## V20426.1 0 55.00 <NA> Visa 16034
## V27685.1 0 275.00 <NA> Visa 27786
## V28983.1 0 550.00 <NA> Visa 14939
## V29860.1 0 275.00 <NA> Visa 27786
## V30168.1 0 56.43 1 Visa 32855
## V32787 0 126.94 1 Visa 33835
## V33009 0 700.00 <NA> Visa 38
## V36304 0 675.00 <NA> Visa 61
filter(df_redemptions, user_id == "40771")
## user_id created_at project_id project.name
## V8943 40771 2021-04-07 19:50:24 277 The Market District
## V9451 40771 2021-04-12 20:59:42 687 Two Hands
## V9581 40771 2021-04-14 21:07:02 687 Two Hands
## V9811 40771 2021-04-16 21:14:38 687 Two Hands
## V11134 40771 2021-04-29 23:08:58 676 50 Eggs Hospitality Group
## V11371 40771 2021-05-01 14:24:03 676 50 Eggs Hospitality Group
## V11617 40771 2021-05-02 22:24:13 676 50 Eggs Hospitality Group
## V13711 40771 2021-05-21 13:01:21 687 Two Hands
## V16077 40771 2021-06-07 19:38:52 687 Two Hands
## V17350 40771 2021-06-17 20:42:45 687 Two Hands
## V17443 40771 2021-06-18 15:34:03 687 Two Hands
## V17709 40771 2021-06-19 21:04:56 277 The Market District
## V17767 40771 2021-06-20 12:07:09 687 Two Hands
## V17957 40771 2021-06-22 09:31:53 687 Two Hands
## V22227 40771 2021-07-26 21:22:51 277 The Market District
## V22485 40771 2021-07-29 19:35:46 277 The Market District
## V22661 40771 2021-07-30 21:37:45 277 The Market District
## V22700 40771 2021-07-31 01:48:10 277 The Market District
## V23890 40771 2021-08-08 21:26:19 277 The Market District
## V25214 40771 2021-08-19 21:43:29 277 The Market District
## V25222 40771 2021-08-19 22:36:23 277 The Market District
## V25738 40771 2021-08-22 14:58:16 687 Two Hands
## V26605 40771 2021-08-29 01:25:31 277 The Market District
## V29948 40771 2021-09-22 20:52:42 687 Two Hands
## V31059 40771 2021-09-29 21:29:08 277 The Market District
## V35439 40771 2021-10-30 12:50:06 277 The Market District
## V35597 40771 2021-10-30 22:24:43 277 The Market District
## V37353 40771 2021-11-11 20:41:24 277 The Market District
## V37785 40771 2021-11-13 22:11:25 277 The Market District
## V40038 40771 2021-11-27 20:26:59 277 The Market District
## V2600.1 40771 2022-01-17 11:53:34 687 Two Hands
## V3001.1 40771 2022-01-20 13:47:12 687 Two Hands
## V3559.1 40771 2022-01-22 20:22:36 687 Two Hands
## V5436.1 40771 2022-02-01 20:20:41 687 Two Hands
## V5957.1 40771 2022-02-04 21:58:43 277 The Market District
## V6327.1 40771 2022-02-06 01:53:30 721 The Concourse Project
## V8660.1 40771 2022-02-16 20:28:11 687 Two Hands
## V9576.1 40771 2022-02-20 14:40:01 277 The Market District
## V12866.1 40771 2022-03-08 19:12:59 687 Two Hands
## V12882.1 40771 2022-03-08 20:00:55 687 Two Hands
## V14326.1 40771 2022-03-16 13:42:28 687 Two Hands
## V14597.1 40771 2022-03-17 21:01:51 277 The Market District
## V14903.1 40771 2022-03-19 02:04:53 277 The Market District
## V17549.1 40771 2022-03-31 13:13:54 687 Two Hands
## V18339.1 40771 2022-04-02 22:21:44 277 The Market District
## V23460.1 40771 2022-04-26 15:49:36 687 Two Hands
## V26511.1 40771 2022-05-05 23:25:49 277 The Market District
## V26770.1 40771 2022-05-06 20:50:46 277 The Market District
## V29665.1 40771 2022-05-14 20:28:43 721 The Concourse Project
## V30502.1 40771 2022-05-17 19:20:34 277 The Market District
## V33192.1 40771 2022-05-25 09:09:35 687 Two Hands
## V33596.1 40771 2022-05-26 12:00:56 277 The Market District
## V53961 40771 2022-07-28 23:03:57 745 Parched Hospitality Group
## V56189 40771 2022-08-06 13:47:59 745 Parched Hospitality Group
## V56313 40771 2022-08-06 19:12:10 716 Union Square Hospitality Group
## V58354 40771 2022-08-14 14:10:53 745 Parched Hospitality Group
## V58945 40771 2022-08-16 22:08:59 716 Union Square Hospitality Group
## V63966 40771 2022-09-05 21:37:24 277 The Market District
## V64509 40771 2022-09-08 20:13:39 745 Parched Hospitality Group
## V64861 40771 2022-09-09 23:18:10 716 Union Square Hospitality Group
## V67391 40771 2022-09-20 14:09:40 277 The Market District
## V72575 40771 2022-10-08 22:26:38 745 Parched Hospitality Group
## V76615 40771 2022-10-23 11:35:35 676 50 Eggs Hospitality Group
## V78299 40771 2022-10-28 21:46:17 277 The Market District
## V85371 40771 2022-11-15 13:36:44 687 Two Hands
## V104122 40771 2022-12-14 12:39:47 741 Black Seed Bagels + Pebble Bar
## Location project_location_id city
## V8943 TenTen 135 Austin
## V9451 Two Hands - Austin South Congress 187 Austin
## V9581 Two Hands - Austin South Congress 187 Austin
## V9811 Two Hands - Austin South Congress 187 Austin
## V11134 CHICA - Miami 2588 Miami
## V11371 Yardbird - Miami 169 Miami Beach
## V11617 CHICA - Miami 2588 Miami
## V13711 Two Hands - Austin South Congress 187 Austin
## V16077 Two Hands - Austin South Congress 187 Austin
## V17350 Two Hands - Austin South Congress 187 Austin
## V17443 Two Hands - Austin South Congress 187 Austin
## V17709 TenTen 135 Austin
## V17767 Two Hands - Austin South Congress 187 Austin
## V17957 Two Hands - Austin South Congress 187 Austin
## V22227 TenTen 135 Austin
## V22485 Devil May Care 134 Austin
## V22661 TenTen 135 Austin
## V22700 Devil May Care 134 Austin
## V23890 TenTen 135 Austin
## V25214 TenTen 135 Austin
## V25222 Devil May Care 134 Austin
## V25738 Two Hands - Austin South Congress 187 Austin
## V26605 Devil May Care 134 Austin
## V29948 Two Hands - Austin South Congress 187 Austin
## V31059 The Well 3266 Austin
## V35439 TenTen 135 Austin
## V35597 TenTen 135 Austin
## V37353 TenTen 135 Austin
## V37785 TenTen 135 Austin
## V40038 TenTen 135 Austin
## V2600.1 Two Hands - Austin South Congress 187 Austin
## V3001.1 Two Hands - Austin South Congress 187 Austin
## V3559.1 Two Hands - Austin South Congress 187 Austin
## V5436.1 Two Hands - Austin South Congress 187 Austin
## V5957.1 TenTen 135 Austin
## V6327.1 The Concourse Project 3350 Austin
## V8660.1 Two Hands - Austin South Congress 187 Austin
## V9576.1 The Well 3266 Austin
## V12866.1 Two Hands - Austin South Congress 187 Austin
## V12882.1 Two Hands - Austin South Congress 187 Austin
## V14326.1 Two Hands - Austin South Congress 187 Austin
## V14597.1 TenTen 135 Austin
## V14903.1 Devil May Care 134 Austin
## V17549.1 Two Hands - Austin South Congress 187 Austin
## V18339.1 TenTen 135 Austin
## V23460.1 Two Hands - Austin South Congress 187 Austin
## V26511.1 Devil May Care 134 Austin
## V26770.1 TenTen 135 Austin
## V29665.1 The Concourse Project 3350 Austin
## V30502.1 TenTen 135 Austin
## V33192.1 Two Hands - Austin South Congress 187 Austin
## V33596.1 The Well 3266 Austin
## V53961 Hole in the Wall, Williamsburg 4739 Brooklyn
## V56189 Hole in the Wall, Williamsburg 4739 Brooklyn
## V56313 Ci Siamo 3322 New York
## V58354 Hole in the Wall, Williamsburg 4739 Brooklyn
## V58945 Union Square Cafe 3298 New York
## V63966 TenTen 135 Austin
## V64509 Hole in the Wall, Williamsburg 4739 Brooklyn
## V64861 Union Square Cafe 3298 New York
## V67391 The Well 3266 Austin
## V72575 Hole in the Wall, Williamsburg 4739 Brooklyn
## V76615 Yardbird - Miami 169 Miami Beach
## V78299 TenTen 135 Austin
## V85371 Two Hands - Williamsburg 185 Brooklyn
## V104122 Black Seed Bagels - Williamsburg 4727 Brooklyn
## state credit_transaction_id total_redemption_amount tip
## V8943 TX 259233 242.48 20.00
## V9451 TX 260374 81.72 16.34
## V9581 TX 260750 81.84 18.00
## V9811 TX 261243 86.61 19.05
## V11134 FL 264165 730.24 20.00
## V11371 FL 264624 252.73 NA
## V11617 FL 265106 117.00 NA
## V13711 TX 269747 70.36 15.48
## V16077 TX 274465 109.33 21.87
## V17350 TX 277041 40.05 10.01
## V17443 TX 277192 18.95 4.74
## V17709 TX 277645 555.33 111.07
## V17767 TX 277785 202.98 40.60
## V17957 TX 278177 84.98 17.00
## V22227 TX 286249 280.39 56.08
## V22485 TX 286856 29.23 5.85
## V22661 TX 287180 334.51 66.90
## V22700 TX 287239 69.28 13.86
## V23890 TX 289984 358.31 71.66
## V25214 TX 292599 284.71 56.94
## V25222 TX 292611 69.28 13.86
## V25738 TX 293562 60.08 12.02
## V26605 TX 296498 86.60 15.59
## V29948 TX 306076 56.83 11.37
## V31059 TX 309036 582.43 116.48
## V35439 TX 323021 995.95 NA
## V35597 TX 323310 225.17 45.03
## V37353 TX 328878 141.82 28.36
## V37785 TX 329755 121.25 24.25
## V40038 TX 342956 149.38 29.87
## V2600.1 TX 387529 119.61 23.92
## V3001.1 TX 388935 93.64 18.72
## V3559.1 TX 390372 147.76 29.55
## V5436.1 TX 395201 90.39 18.07
## V5957.1 TX 396507 264.13 52.82
## V6327.1 TX 397266 1082.50 200.00
## V8660.1 TX 405686 53.04 10.60
## V9576.1 TX 407567 136.41 27.28
## V12866.1 TX 421823 273.34 54.66
## V12882.1 TX 421860 102.30 20.46
## V14326.1 TX 426601 20.02 4.00
## V14597.1 TX 427194 307.00 61.40
## V14903.1 TX 427820 389.70 77.94
## V17549.1 TX 443899 151.01 33.22
## V18339.1 TX 447772 171.04 37.63
## V23460.1 TX 463509 81.72 16.61
## V26511.1 TX 478213 18.40 4.05
## V26770.1 TX 478914 115.83 25.48
## V29665.1 TX 489879 3000.00 120.00
## V30502.1 TX 493379 53.05 10.78
## V33192.1 TX 503313 59.00 11.99
## V33596.1 TX 504231 57.38 11.66
## V53961 NY 548890 36.47 7.37
## V56189 NY 553349 179.10 36.19
## V56313 NY 553571 398.48 73.20
## V58354 NY 557462 84.11 17.00
## V58945 NY 558613 207.95 42.02
## V63966 TX 568211 142.88 29.04
## V64509 NY 569175 145.88 29.48
## V64861 NY 569821 459.46 92.84
## V67391 TX 574597 84.43 15.60
## V72575 NY 584322 263.45 52.85
## V76615 FL 591884 95.92 17.92
## V78299 TX 595035 220.81 51.00
## V85371 NY 609460 20.14 3.70
## V104122 NY 654322 22.81 5.02
## Venue.Type...Detail Check.Average Service.Type
## V8943 Casual Fine Dining Mid Full Service
## V9451 Casual Dining Mid Full Service
## V9581 Casual Dining Mid Full Service
## V9811 Casual Dining Mid Full Service
## V11134 Casual Fine Dining Mid Full Service
## V11371 Casual Fine Dining Mid Full Service
## V11617 Casual Fine Dining Mid Full Service
## V13711 Casual Dining Mid Full Service
## V16077 Casual Dining Mid Full Service
## V17350 Casual Dining Mid Full Service
## V17443 Casual Dining Mid Full Service
## V17709 Casual Fine Dining Mid Full Service
## V17767 Casual Dining Mid Full Service
## V17957 Casual Dining Mid Full Service
## V22227 Casual Fine Dining Mid Full Service
## V22485 Nightclub Mid Full Service
## V22661 Casual Fine Dining Mid Full Service
## V22700 Nightclub Mid Full Service
## V23890 Casual Fine Dining Mid Full Service
## V25214 Casual Fine Dining Mid Full Service
## V25222 Nightclub Mid Full Service
## V25738 Casual Dining Mid Full Service
## V26605 Nightclub Mid Full Service
## V29948 Casual Dining Mid Full Service
## V31059 Casual Fine Dining Mid Full Service
## V35439 Casual Fine Dining Mid Full Service
## V35597 Casual Fine Dining Mid Full Service
## V37353 Casual Fine Dining Mid Full Service
## V37785 Casual Fine Dining Mid Full Service
## V40038 Casual Fine Dining Mid Full Service
## V2600.1 Casual Dining Mid Full Service
## V3001.1 Casual Dining Mid Full Service
## V3559.1 Casual Dining Mid Full Service
## V5436.1 Casual Dining Mid Full Service
## V5957.1 Casual Fine Dining Mid Full Service
## V6327.1 Nightclub High Fast Casual
## V8660.1 Casual Dining Mid Full Service
## V9576.1 Casual Fine Dining Mid Full Service
## V12866.1 Casual Dining Mid Full Service
## V12882.1 Casual Dining Mid Full Service
## V14326.1 Casual Dining Mid Full Service
## V14597.1 Casual Fine Dining Mid Full Service
## V14903.1 Nightclub Mid Full Service
## V17549.1 Casual Dining Mid Full Service
## V18339.1 Casual Fine Dining Mid Full Service
## V23460.1 Casual Dining Mid Full Service
## V26511.1 Nightclub Mid Full Service
## V26770.1 Casual Fine Dining Mid Full Service
## V29665.1 Nightclub High Fast Casual
## V30502.1 Casual Fine Dining Mid Full Service
## V33192.1 Casual Dining Mid Full Service
## V33596.1 Casual Fine Dining Mid Full Service
## V53961 Cafe Mid Full Service
## V56189 Cafe Mid Full Service
## V56313 Fine Dining Very High Full Service
## V58354 Cafe Mid Full Service
## V58945 Fine Dining Very High Full Service
## V63966 Casual Fine Dining Mid Full Service
## V64509 Cafe Mid Full Service
## V64861 Fine Dining Very High Full Service
## V67391 Casual Fine Dining Mid Full Service
## V72575 Cafe Mid Full Service
## V76615 Casual Fine Dining Mid Full Service
## V78299 Casual Fine Dining Mid Full Service
## V85371 Casual Dining Mid Full Service
## V104122 Fast Casual Mid QSR
filter(df_users_thru_jan23, user_id == "40771")
## user_id account_created_at zip_code user_app_version user_app_platform
## V30184 40771 2021-03-17 19:12:32 <NA> 6.4.17.470 ios
user_id: 41453filter(df_revenue_view, user_id == "41453")
## UID name project_id gcp_id ict_id
## V5640 39623g The Market District 277 39623 <NA>
## V6170 40247g The Market District 277 40247 <NA>
## V9398 44219g Two Hands 687 44219 <NA>
## V9700 44568g The Market District 277 44568 <NA>
## V10712 45863g Rosen's Bagels 312 45863 <NA>
## V11076 46324g The Market District 277 46324 <NA>
## V11988 47404g The Farmers Butcher 683 47404 <NA>
## V12145 47574g Stout's 700 47574 <NA>
## V13607 49383g The Market District 277 49383 <NA>
## V15089 51053g The Market District 277 51053 <NA>
## V16571 52963g Two Hands 687 52963 <NA>
## V18871 55953g The Market District 277 55953 <NA>
## V19750 57022g Silk Road Hospitality 713 57022 <NA>
## V22490 60403g Matthew Kenney 695 60403 <NA>
## V22491 60404g Union Square Hospitality Group 716 60404 <NA>
## V22498 60412g Silk Road Hospitality 713 60412 <NA>
## V23554 61855g Silk Road Hospitality 713 61855 <NA>
## V24472 63047g 50 Eggs Hospitality Group 676 63047 <NA>
## V27148 66253g The Bungalow 715 66253 <NA>
## V27234 66395g Matthew Kenney 695 66395 <NA>
## V27390 66594g Matthew Kenney 695 66594 <NA>
## V29255 68919g Thunderdome Restaurant Group 692 68919 <NA>
## V29576 69367g Thunderdome Restaurant Group 692 69367 <NA>
## V628.1 72292g Silk Road Hospitality 713 72292 <NA>
## V1387.1 73240g The Market District 277 73240 <NA>
## V5419.1 78057g The Bungalow 715 78057 <NA>
## V6114.1 78906g The Market District 277 78906 <NA>
## V6540.1 79438g Bluestone Lane 699 79438 <NA>
## V6584.1 79490g Disruptive Group 723 79490 <NA>
## V6644.1 79583g Matthew Kenney 695 79583 <NA>
## V6699.1 79648g Mirame 729 79648 <NA>
## V11777.1 85655g The Market District 277 85655 <NA>
## V12104.1 86027g The Market District 277 86027 <NA>
## V12105.1 86028g Stout's 700 86028 <NA>
## V13408.1 87477g The Electric Jane 720 87477 <NA>
## V20876.1 95859g Citizens Manhattan West 722 95859 <NA>
## V20877.1 95860g Matthew Kenney 695 95860 <NA>
## V30170.1 106462g Strangebird Hospitality 731 106462 <NA>
## V30453.1 106779g Union Square Hospitality Group 716 106779 <NA>
## V31882 108440g The Market District 277 108440 <NA>
## V33555 i20802 inKind Pass -999 <NA> 20802
## V38845 i22467 inKind Pass -999 <NA> 22467
## V64419 i44013 inKind Pass -999 <NA> 44013
## V75257 i53458 inKind Pass -999 <NA> 53458
## created_at amount_charged_in_usd utm_campaign utm_medium
## V5640 2021-04-15 20:51:36 500.00 <NA> <NA>
## V6170 2021-04-24 02:16:04 250.00 <NA> <NA>
## V9398 2021-05-28 16:43:29 250.00 <NA> <NA>
## V9700 2021-05-31 00:01:45 250.00 <NA> <NA>
## V10712 2021-06-14 17:13:02 250.00 <NA> <NA>
## V11076 2021-06-19 04:25:39 18.85 <NA> <NA>
## V11988 2021-06-29 20:49:22 232.00 <NA> <NA>
## V12145 2021-07-01 23:31:49 250.00 <NA> <NA>
## V13607 2021-07-26 22:46:32 250.00 <NA> <NA>
## V15089 2021-08-07 00:55:04 250.00 <NA> <NA>
## V16571 2021-08-26 17:34:00 250.00 <NA> <NA>
## V18871 2021-09-23 15:28:51 250.00 <NA> <NA>
## V19750 2021-09-30 14:08:52 250.00 <NA> <NA>
## V22490 2021-10-28 00:42:05 250.00 <NA> <NA>
## V22491 2021-10-28 00:42:58 250.00 <NA> <NA>
## V22498 2021-10-28 01:01:34 2.27 <NA> <NA>
## V23554 2021-11-06 00:08:18 250.00 <NA> <NA>
## V24472 2021-11-19 05:04:34 180.99 <NA> <NA>
## V27148 2021-12-05 02:38:37 250.00 <NA> <NA>
## V27234 2021-12-06 05:38:27 0.96 <NA> <NA>
## V27390 2021-12-08 17:18:12 34.00 <NA> <NA>
## V29255 2021-12-20 02:45:46 61.36 <NA> <NA>
## V29576 2021-12-21 19:15:38 29.95 <NA> <NA>
## V628.1 2022-01-09 22:52:30 250.00 <NA> <NA>
## V1387.1 2022-01-20 02:40:47 250.00 <NA> <NA>
## V5419.1 2022-02-25 15:15:06 500.00 <NA> <NA>
## V6114.1 2022-03-05 01:50:00 115.38 <NA> <NA>
## V6540.1 2022-03-10 20:22:45 6.26 <NA> <NA>
## V6584.1 2022-03-11 02:47:58 63.24 <NA> <NA>
## V6644.1 2022-03-11 22:51:12 30.62 <NA> <NA>
## V6699.1 2022-03-12 03:39:28 226.67 <NA> <NA>
## V11777.1 2022-04-27 18:19:52 145.06 <NA> <NA>
## V12104.1 2022-04-29 18:44:21 250.00 <NA> <NA>
## V12105.1 2022-04-29 18:44:58 250.00 <NA> <NA>
## V13408.1 2022-05-07 03:19:52 88.35 <NA> <NA>
## V20876.1 2022-06-14 16:51:15 250.00 <NA> <NA>
## V20877.1 2022-06-14 16:52:00 250.00 <NA> <NA>
## V30170.1 2022-08-17 02:14:20 174.17 <NA> <NA>
## V30453.1 2022-08-19 02:07:04 223.73 <NA> <NA>
## V31882 2022-08-31 18:32:56 227.55 <NA> <NA>
## V33555 2022-09-13 23:15:22 499.00 <NA> <NA>
## V38845 2022-10-14 23:58:37 499.00 <NA> <NA>
## V64419 2022-11-28 16:48:57 499.00 <NA> <NA>
## V75257 2022-12-16 02:01:10 499.00 <NA> <NA>
## utm_content utm_source is_app_purchase user_id transaction_type
## V5640 <NA> <NA> 0 41453 1
## V6170 <NA> <NA> 0 41453 1
## V9398 <NA> <NA> 0 41453 1
## V9700 <NA> <NA> 0 41453 1
## V10712 <NA> <NA> 0 41453 1
## V11076 <NA> <NA> 0 41453 1
## V11988 <NA> <NA> 0 41453 1
## V12145 <NA> <NA> 0 41453 1
## V13607 <NA> <NA> 0 41453 1
## V15089 <NA> <NA> 0 41453 1
## V16571 <NA> <NA> 0 41453 1
## V18871 <NA> <NA> 0 41453 1
## V19750 <NA> <NA> 0 41453 1
## V22490 <NA> <NA> 0 41453 1
## V22491 <NA> <NA> 0 41453 1
## V22498 <NA> <NA> 0 41453 1
## V23554 <NA> <NA> 0 41453 1
## V24472 <NA> <NA> 0 41453 1
## V27148 <NA> <NA> 0 41453 1
## V27234 <NA> <NA> 0 41453 1
## V27390 <NA> <NA> 0 41453 1
## V29255 <NA> <NA> 0 41453 1
## V29576 <NA> <NA> 0 41453 1
## V628.1 <NA> <NA> 0 41453 1
## V1387.1 <NA> <NA> 1 41453 1
## V5419.1 <NA> <NA> 1 41453 1
## V6114.1 <NA> <NA> 0 41453 1
## V6540.1 <NA> <NA> 0 41453 1
## V6584.1 <NA> <NA> 0 41453 1
## V6644.1 <NA> <NA> 0 41453 1
## V6699.1 <NA> <NA> 0 41453 1
## V11777.1 <NA> <NA> 0 41453 1
## V12104.1 <NA> <NA> 1 41453 1
## V12105.1 <NA> <NA> 1 41453 1
## V13408.1 <NA> <NA> 0 41453 1
## V20876.1 <NA> <NA> 1 41453 1
## V20877.1 <NA> <NA> 1 41453 1
## V30170.1 <NA> <NA> 0 41453 1
## V30453.1 <NA> <NA> 0 41453 1
## V31882 <NA> <NA> 0 41453 1
## V33555 <NA> <NA> 1 41453 1
## V38845 <NA> <NA> 1 41453 1
## V64419 <NA> <NA> 1 41453 1
## V75257 <NA> <NA> 1 41453 1
## credit_type credit_given_in_usd is_excess stripe_brand option_id
## V5640 0 625.00 <NA> Visa 4919
## V6170 0 300.00 <NA> Visa 6015
## V9398 0 300.00 <NA> Visa 10743
## V9700 0 300.00 <NA> Visa 6015
## V10712 0 300.00 <NA> Visa 5876
## V11076 0 18.85 1 Visa 12688
## V11988 0 290.00 <NA> Visa 12927
## V12145 0 300.00 <NA> Visa 11030
## V13607 0 300.00 <NA> Visa 6015
## V15089 0 300.00 <NA> Visa 6015
## V16571 0 300.00 <NA> Visa 10743
## V18871 0 300.00 <NA> Visa 6015
## V19750 0 300.00 <NA> Visa 14099
## V22490 0 300.00 <NA> Visa 10753
## V22491 0 325.00 <NA> Visa 15631
## V22498 0 2.27 1 Visa 15833
## V23554 0 275.00 <NA> Visa 15998
## V24472 0 180.99 1 Visa 16615
## V27148 0 275.00 <NA> Visa 16083
## V27234 0 0.96 1 Visa 17146
## V27390 0 34.00 1 Visa 17177
## V29255 0 61.36 1 Visa 17823
## V29576 0 29.95 1 Visa 17881
## V628.1 0 275.00 <NA> Visa 15998
## V1387.1 0 275.00 <NA> Visa 16099
## V5419.1 0 600.00 <NA> Visa 16084
## V6114.1 0 115.38 1 Visa 21038
## V6540.1 0 6.26 1 Visa 21217
## V6584.1 0 63.24 1 Visa 21237
## V6644.1 0 30.62 1 Visa 21297
## V6699.1 0 226.67 1 Visa 21330
## V11777.1 0 145.06 1 Visa 23516
## V12104.1 0 275.00 <NA> Visa 16099
## V12105.1 0 325.00 <NA> Visa 16246
## V13408.1 0 88.35 1 Visa 24781
## V20876.1 0 275.00 <NA> Visa 16120
## V20877.1 0 275.00 <NA> Visa 10373
## V30170.1 0 174.17 1 Visa 32857
## V30453.1 0 223.73 1 Visa 32938
## V31882 0 227.55 1 Visa 33520
## V33555 0 700.00 <NA> Visa 38
## V38845 0 675.00 <NA> Visa 61
## V64419 0 700.00 <NA> Visa 38
## V75257 0 600.00 <NA> Visa 55
filter(df_redemptions, user_id == "41453")
## user_id created_at project_id project.name
## V9221 41453 2021-04-10 15:30:46 687 Two Hands
## V9827 41453 2021-04-16 23:25:32 277 The Market District
## V10508 41453 2021-04-23 21:16:49 277 The Market District
## V14428 41453 2021-05-27 11:09:24 687 Two Hands
## V14553 41453 2021-05-28 11:17:39 687 Two Hands
## V14554 41453 2021-05-28 11:18:39 687 Two Hands
## V16493 41453 2021-06-11 14:20:19 687 Two Hands
## V17064 41453 2021-06-15 12:59:15 312 Rosen's Bagels
## V17520 41453 2021-06-18 21:22:33 277 The Market District
## V17535 41453 2021-06-18 23:25:41 277 The Market District
## V18280 41453 2021-06-25 08:54:50 687 Two Hands
## V19183 41453 2021-07-01 17:09:09 683 The Farmers Butcher
## V19225 41453 2021-07-01 19:27:16 700 Stout's
## V20739 41453 2021-07-15 11:18:54 687 Two Hands
## V21512 41453 2021-07-21 13:42:54 312 Rosen's Bagels
## V22240 41453 2021-07-27 09:35:07 687 Two Hands
## V23568 41453 2021-08-06 23:29:27 277 The Market District
## V30100 41453 2021-09-23 21:53:59 277 The Market District
## V34165 41453 2021-10-21 20:58:00 713 Silk Road Hospitality
## V35019 41453 2021-10-27 20:01:35 713 Silk Road Hospitality
## V36118 41453 2021-11-04 12:25:24 687 Two Hands
## V36391 41453 2021-11-05 20:21:02 713 Silk Road Hospitality
## V37106 41453 2021-11-10 14:49:48 687 Two Hands
## V37263 41453 2021-11-11 14:11:18 687 Two Hands
## V37270 41453 2021-11-11 14:43:28 687 Two Hands
## V38018 41453 2021-11-15 13:14:48 687 Two Hands
## V38099 41453 2021-11-16 14:14:20 687 Two Hands
## V38444 41453 2021-11-18 21:04:36 676 50 Eggs Hospitality Group
## V41255 41453 2021-12-04 20:07:32 715 The Bungalow
## V41264 41453 2021-12-04 20:27:07 715 The Bungalow
## V41517 41453 2021-12-05 21:38:29 695 Matthew Kenney
## V44012 41453 2021-12-18 21:53:10 713 Silk Road Hospitality
## V44238 41453 2021-12-19 20:45:48 692 Thunderdome Restaurant Group
## V44432 41453 2021-12-21 14:15:40 692 Thunderdome Restaurant Group
## V464.1 41453 2022-01-04 14:21:31 687 Two Hands
## V844.1 41453 2022-01-07 14:23:14 687 Two Hands
## V1360.1 41453 2022-01-09 18:17:22 713 Silk Road Hospitality
## V1621.1 41453 2022-01-12 12:18:27 687 Two Hands
## V1935.1 41453 2022-01-14 10:59:12 687 Two Hands
## V2942.1 41453 2022-01-19 20:40:52 277 The Market District
## V4116.1 41453 2022-01-26 13:51:11 312 Rosen's Bagels
## V7249.1 41453 2022-02-11 12:38:12 312 Rosen's Bagels
## V10014.1 41453 2022-02-23 09:13:50 312 Rosen's Bagels
## V11333.1 41453 2022-03-01 11:55:06 687 Two Hands
## V11334.1 41453 2022-03-01 11:58:02 687 Two Hands
## V11358.1 41453 2022-03-01 13:18:22 687 Two Hands
## V11985.1 41453 2022-03-04 19:50:02 277 The Market District
## V13077.1 41453 2022-03-10 12:22:48 699 Bluestone Lane
## V13167.1 41453 2022-03-10 18:48:00 723 Disruptive Group
## V13312.1 41453 2022-03-11 14:51:14 695 Matthew Kenney
## V13399.1 41453 2022-03-11 19:39:31 729 Mirame
## V14770.1 41453 2022-03-18 19:11:46 700 Stout's
## V23596.1 41453 2022-04-27 09:36:53 312 Rosen's Bagels
## V23653.1 41453 2022-04-27 13:19:54 277 The Market District
## V26833.1 41453 2022-05-06 22:19:54 720 The Electric Jane
## V32702.1 41453 2022-05-23 10:07:01 312 Rosen's Bagels
## V38951.1 41453 2022-06-09 13:52:14 312 Rosen's Bagels
## V40803.1 41453 2022-06-15 09:39:34 312 Rosen's Bagels
## V43078.1 41453 2022-06-22 14:15:02 277 The Market District
## V58947 41453 2022-08-16 22:14:23 731 Strangebird Hospitality
## V59125 41453 2022-08-17 20:34:16 722 Citizens Manhattan West
## V59407 41453 2022-08-18 22:07:07 716 Union Square Hospitality Group
## V62499 41453 2022-08-31 13:32:58 277 The Market District
## V67583 41453 2022-09-21 15:16:19 224 Juliet Italian Kitchen
## V67584 41453 2022-09-21 15:36:30 224 Juliet Italian Kitchen
## V69343 41453 2022-09-27 20:03:55 700 Stout's
## V71307 41453 2022-10-05 10:24:04 277 The Market District
## V73719 41453 2022-10-13 19:02:21 277 The Market District
## V74134 41453 2022-10-14 21:28:34 277 The Market District
## V85274 41453 2022-11-15 10:16:50 687 Two Hands
## V86734 41453 2022-11-17 19:27:24 700 Stout's
## V96968 41453 2022-12-03 12:01:59 687 Two Hands
## V99204 41453 2022-12-06 14:25:17 687 Two Hands
## V104453 41453 2022-12-14 20:21:05 277 The Market District
## V104734 41453 2022-12-15 13:20:37 676 50 Eggs Hospitality Group
## V105024 41453 2022-12-15 20:16:36 785 Major Food Group
## V105129 41453 2022-12-15 22:18:19 785 Major Food Group
## V105192 41453 2022-12-16 10:23:00 785 Major Food Group
## V105694 41453 2022-12-16 19:46:56 711 Higher Ground
## Location project_location_id
## V9221 Two Hands - Austin South Congress 187
## V9827 TenTen 135
## V10508 Devil May Care 134
## V14428 Two Hands - Austin South Congress 187
## V14553 Two Hands - Austin South Congress 187
## V14554 Two Hands - Austin South Congress 187
## V16493 Two Hands - Austin South Congress 187
## V17064 Rosen's Bagels 2678
## V17520 TenTen 135
## V17535 Devil May Care 134
## V18280 Two Hands - Austin South Congress 187
## V19183 The Farmer's Butcher 2646
## V19225 Stout’s Signature Tobin 2626
## V20739 Two Hands - Austin South Congress 187
## V21512 Rosen's Bagels 2678
## V22240 Two Hands - Austin South Congress 187
## V23568 TenTen 135
## V30100 The Well 3266
## V34165 District Kitchen Slaughter Lane 3278
## V35019 District Kitchen Slaughter Lane 3278
## V36118 Two Hands - Austin South Congress 187
## V36391 District Kitchen Slaughter Lane 3278
## V37106 Two Hands - Austin South Congress 187
## V37263 Two Hands - Austin South Congress 187
## V37270 Two Hands - Austin South Congress 187
## V38018 Two Hands - Austin South Congress 187
## V38099 Two Hands - Austin South Congress 187
## V38444 Yardbird - Las Vegas 167
## V41255 The Bungalow - Huntington Beach 3292
## V41264 The Bungalow - Huntington Beach 3292
## V41517 SESTINA - LA 2596
## V44012 District Kitchen Slaughter Lane 3278
## V44238 Bakersfield - Nashville 2562
## V44432 Currito -Harper's Point 2582
## V464.1 Two Hands - Austin South Congress 187
## V844.1 Two Hands - Austin South Congress 187
## V1360.1 Keepers Coastal Kitchen 3282
## V1621.1 Two Hands - Austin South Congress 187
## V1935.1 Two Hands - Austin South Congress 187
## V2942.1 The Well 3266
## V4116.1 Rosen's Bagels 2678
## V7249.1 Rosen's Bagels 2678
## V10014.1 Rosen's Bagels 2678
## V11333.1 Two Hands - Austin South Congress 187
## V11334.1 Two Hands - Austin South Congress 187
## V11358.1 Two Hands - Austin South Congress 187
## V11985.1 The Well 3266
## V13077.1 Bluestone Lane (Venice Beach) 3171
## V13167.1 Katsuya Brentwood 3353
## V13312.1 PLANT FOOD + WINE 2594
## V13399.1 Mirame 4588
## V14770.1 Stout’s Pizza Co. Northwoods 2622
## V23596.1 Rosen's Bagels 2678
## V23653.1 The Well 3266
## V26833.1 Electric Jane 3346
## V32702.1 Rosen's Bagels 2678
## V38951.1 Rosen's Bagels 2678
## V40803.1 Rosen's Bagels 2678
## V43078.1 The Well 3266
## V58947 Orchard Townhouse 4614
## V59125 Katsuya 3376
## V59407 Gramercy Tavern 3299
## V62499 The Well 3266
## V67583 Juliet Italian Kitchen - Barton Springs 2603
## V67584 Juliet Italian Kitchen - Arboretum 2604
## V69343 Stout’s Signature Tobin 2626
## V71307 The Well 3266
## V73719 The Well 3266
## V74134 TenTen 135
## V85274 Two Hands - Austin South Congress 187
## V86734 Stout’s Signature Tobin 2626
## V96968 Two Hands - Nashville 4949
## V99204 Two Hands - Nashville 4949
## V104453 The Well 3266
## V104734 Yardbird - Dallas 180
## V105024 Carbone Dallas 4956
## V105129 Carbone Vino 4957
## V105192 Sadelle's Dallas 4958
## V105694 Higher Ground, Austin 3263
## city state credit_transaction_id total_redemption_amount
## V9221 Austin TX 259899 62.79
## V9827 Austin TX 261272 482.84
## V10508 Austin TX 262706 415.68
## V14428 Austin TX 271175 1.00
## V14553 Austin TX 271534 1.00
## V14554 Austin TX 271537 1.00
## V16493 Austin TX 275392 102.83
## V17064 Austin TX 276452 18.51
## V17520 Austin TX 277325 265.22
## V17535 Austin TX 277355 80.11
## V18280 Austin TX 278824 124.48
## V19183 San Antonio TX 280503 131.06
## V19225 San Antonio TX 280570 196.49
## V20739 Austin TX 283481 1.00
## V21512 Austin TX 284886 23.38
## V22240 Austin TX 286289 48.17
## V23568 Austin TX 289461 532.58
## V30100 Austin TX 306740 242.48
## V34165 Austin TX 318459 54.36
## V35019 Austin TX 321083 247.91
## V36118 Austin TX 325472 2.00
## V36391 Austin TX 326266 129.91
## V37106 Austin TX 328289 2.00
## V37263 Austin TX 328611 2.00
## V37270 Austin TX 328619 2.00
## V38018 Austin TX 330731 2.00
## V38099 Austin TX 331049 2.00
## V38444 Las Vegas NV 334068 180.99
## V41255 Huntington Beach CA 348331 120.69
## V41264 Huntington Beach CA 348347 72.00
## V41517 Culver City CA 349081 300.96
## V44012 Austin TX 369697 142.88
## V44238 Nashville TN 371395 61.36
## V44432 Cincinnati OH 373208 29.95
## V464.1 Austin TX 381004 2.00
## V844.1 Austin TX 382185 2.00
## V1360.1 Austin TX 383458 112.57
## V1621.1 Austin TX 384926 2.00
## V1935.1 Austin TX 385917 2.00
## V2942.1 Austin TX 388746 218.69
## V4116.1 Austin TX 392225 5.85
## V7249.1 Austin TX 402376 51.96
## V10014.1 Austin TX 408735 18.76
## V11333.1 Austin TX 415592 67.12
## V11334.1 Austin TX 415593 6.50
## V11358.1 Austin TX 415619 2.00
## V11985.1 Austin TX 418144 296.63
## V13077.1 Venice CA 423498 6.26
## V13167.1 Los Angeles CA 423805 63.24
## V13312.1 Venice CA 424142 30.62
## V13399.1 Beverly Hills CA 424429 226.67
## V14770.1 San Antonio TX 427589 34.62
## V23596.1 Austin TX 464039 4.06
## V23653.1 Austin TX 465924 145.06
## V26833.1 Nashville TN 479026 88.35
## V32702.1 Austin TX 501821 41.13
## V38951.1 Austin TX 516769 2.00
## V40803.1 Austin TX 521300 17.32
## V43078.1 Austin TX 526469 28.14
## V58947 New York NY 558618 174.17
## V59125 New York NY 558912 161.13
## V59407 New York NY 559500 548.73
## V62499 Austin TX 565272 228.41
## V67583 Austin TX 574941 4.06
## V67584 Austin TX 574946 4.06
## V69343 San Antonio TX 578325 124.01
## V71307 Austin TX 581921 131.25
## V73719 Austin TX 586465 184.05
## V74134 Austin TX 587183 557.48
## V85274 Austin TX 609343 142.89
## V86734 San Antonio TX 612851 75.72
## V96968 Nashville TN 637762 149.41
## V99204 Nashville TN 642695 71.02
## V104453 Austin TX 655233 219.75
## V104734 Dallas TX 656046 41.14
## V105024 Dallas TX 656695 478.19
## V105129 Dallas TX 656943 21.65
## V105192 Dallas TX 657230 40.05
## V105694 Austin TX 658440 30.31
## tip Venue.Type...Detail Check.Average Service.Type
## V9221 15.00 Casual Dining Mid Full Service
## V9827 106.22 Casual Fine Dining Mid Full Service
## V10508 91.45 Nightclub Mid Full Service
## V14428 NA Casual Dining Mid Full Service
## V14553 NA Casual Dining Mid Full Service
## V14554 1.00 Casual Dining Mid Full Service
## V16493 20.57 Casual Dining Mid Full Service
## V17064 4.07 Cafe Low QSR
## V17520 66.31 Casual Fine Dining Mid Full Service
## V17535 20.03 Nightclub Mid Full Service
## V18280 27.39 Casual Dining Mid Full Service
## V19183 23.59 Market Mid QSR
## V19225 49.12 Casual Fine Dining Low Full Service
## V20739 NA Casual Dining Mid Full Service
## V21512 5.84 Cafe Low QSR
## V22240 10.60 Casual Dining Mid Full Service
## V23568 117.17 Casual Fine Dining Mid Full Service
## V30100 60.62 Casual Fine Dining Mid Full Service
## V34165 9.78 Casual Dining Mid Full Service
## V35019 54.54 Casual Dining Mid Full Service
## V36118 NA Casual Dining Mid Full Service
## V36391 28.58 Casual Dining Mid Full Service
## V37106 NA Casual Dining Mid Full Service
## V37263 NA Casual Dining Mid Full Service
## V37270 NA Casual Dining Mid Full Service
## V38018 NA Casual Dining Mid Full Service
## V38099 NA Casual Dining Mid Full Service
## V38444 41.88 Casual Fine Dining Mid Full Service
## V41255 28.00 Bar High Unknown
## V41264 18.00 Bar High Unknown
## V41517 60.28 Casual Fine Dining High Full Service
## V44012 31.43 Casual Dining Mid Full Service
## V44238 11.66 Casual Dining Mid Full Service
## V44432 5.55 Fast Casual Mid Fast Casual
## V464.1 NA Casual Dining Mid Full Service
## V844.1 NA Casual Dining Mid Full Service
## V1360.1 24.76 Casual Dining Mid Fast Casual
## V1621.1 NA Casual Dining Mid Full Service
## V1935.1 NA Casual Dining Mid Full Service
## V2942.1 48.11 Casual Fine Dining Mid Full Service
## V4116.1 3.00 Cafe Low QSR
## V7249.1 10.39 Cafe Low QSR
## V10014.1 4.12 Cafe Low QSR
## V11333.1 14.76 Casual Dining Mid Full Service
## V11334.1 1.00 Casual Dining Mid Full Service
## V11358.1 NA Casual Dining Mid Full Service
## V11985.1 65.25 Casual Fine Dining Mid Full Service
## V13077.1 1.00 Coffee Shop Very Low QSR
## V13167.1 12.00 Casual Fine Dining High Full Service
## V13312.1 6.38 Casual Fine Dining High Full Service
## V13399.1 49.86 Casual Fine Dining High Full Service
## V14770.1 6.92 Casual Dining Low Fast Casual
## V23596.1 2.00 Cafe Low QSR
## V23653.1 31.91 Casual Fine Dining Mid Full Service
## V26833.1 19.44 Fine Dining Mid Full Service
## V32702.1 9.05 Cafe Low QSR
## V38951.1 NA Cafe Low QSR
## V40803.1 3.81 Cafe Low QSR
## V43078.1 5.72 Casual Fine Dining Mid Full Service
## V58947 35.20 Fine Dining High Full Service
## V59125 32.56 Casual Fine Dining High Full Service
## V59407 110.88 Fine Dining Very High Full Service
## V62499 46.42 Casual Fine Dining Mid Full Service
## V67583 NA Unknown Mid Unknown
## V67584 NA Unknown Mid Unknown
## V69343 31.00 Casual Fine Dining Low Full Service
## V71307 26.68 Casual Fine Dining Mid Full Service
## V73719 37.40 Casual Fine Dining Mid Full Service
## V74134 113.30 Casual Fine Dining Mid Full Service
## V85274 29.04 Casual Dining Mid Full Service
## V86734 20.00 Casual Fine Dining Low Full Service
## V96968 29.81 Casual Dining Mid Full Service
## V99204 14.30 Casual Dining Mid Full Service
## V104453 50.75 Casual Fine Dining Mid Full Service
## V104734 9.05 Casual Fine Dining Mid Full Service
## V105024 140.00 Casual Fine Dining High Full Service
## V105129 5.00 Casual Fine Dining High Full Service
## V105192 NA Casual Fine Dining High Full Service
## V105694 6.16 Bar Mid Full Service
filter(df_users_thru_jan23, user_id == "41453")
## user_id account_created_at zip_code user_app_version user_app_platform
## V30788 41453 2021-03-29 21:50:23 <NA> 6.4.13.422 ios
user_id: 63193filter(df_revenue_view, user_id == "63193")
## UID name project_id gcp_id ict_id
## V23345 61592g The Market District 277 61592 <NA>
## V27389 66593g Two Hands 687 66593 <NA>
## V1474.1 73356g Juliet Italian Kitchen 224 73356 <NA>
## V1495.1 73384g Juliet Italian Kitchen 224 73384 <NA>
## V3505.1 75772g Salvation Pizza 681 75772 <NA>
## V3613.1 75887g Two Hands 687 75887 <NA>
## V7558.1 80687g The Market District 277 80687 <NA>
## V10360.1 84005g The Market District 277 84005 <NA>
## V15829.1 90216g Two Hands 687 90216 <NA>
## V20703.1 95679g The Market District 277 95679 <NA>
## V22093.1 97249g Matthew Kenney 695 97249 <NA>
## V25518.1 101175g Higher Ground 711 101175 <NA>
## V25519.1 101176g Higher Ground 711 101176 <NA>
## V25796.1 101496g Two Hands 687 101496 <NA>
## V26228.1 102002g The Market District 277 102002 <NA>
## V30637.1 106986g Two Hands 687 106986 <NA>
## V32092 108672g Le Pigeon 736 108672 <NA>
## V33097 i20768 inKind Pass -999 <NA> 20768
## V33417 110183g Juliet Italian Kitchen 224 110183 <NA>
## V35051 i20918 inKind Pass -999 <NA> 20918
## V37388 i21524 inKind Pass -999 <NA> 21524
## V40089 i23302 inKind Pass -999 <NA> 23302
## V55239 i36283 inKind Pass -999 <NA> 36283
## V69568 i47716 inKind Pass -999 <NA> 47716
## V1089.2 146993g Two Hands 687 146993 <NA>
## V4761.2 i74498 inKind Pass -999 <NA> 74498
## V12536.2 151672g Rosebud Restaurants 811 151672 <NA>
## V18433.2 154292g Salvation Pizza 681 154292 <NA>
## V19405.2 i93776 inKind Pass -999 <NA> 93776
## created_at amount_charged_in_usd utm_campaign utm_medium
## V23345 2021-11-03 17:02:18 250.00 <NA> <NA>
## V27389 2021-12-08 17:02:00 250.00 <NA> <NA>
## V1474.1 2022-01-21 16:16:39 250.00 <NA> <NA>
## V1495.1 2022-01-21 21:21:18 80.00
## V3505.1 2022-02-10 03:05:00 50.00 <NA> <NA>
## V3613.1 2022-02-10 20:24:03 250.00 <NA> <NA>
## V7558.1 2022-03-22 15:10:45 250.00 <NA> <NA>
## V10360.1 2022-04-15 01:19:16 250.00 <NA> <NA>
## V15829.1 2022-05-20 20:06:07 250.00 <NA> <NA>
## V20703.1 2022-06-12 23:13:15 250.00 <NA> <NA>
## V22093.1 2022-06-22 00:09:19 250.00 <NA> <NA>
## V25518.1 2022-07-12 23:52:03 100.00 <NA> <NA>
## V25519.1 2022-07-12 23:52:15 100.00 <NA> <NA>
## V25796.1 2022-07-15 22:52:49 250.00 <NA> <NA>
## V26228.1 2022-07-19 01:47:09 250.00 <NA> <NA>
## V30637.1 2022-08-20 15:11:34 250.00 <NA> <NA>
## V32092 2022-09-02 02:23:41 250.00 <NA> <NA>
## V33097 2022-09-09 20:05:14 249.00 <NA> <NA>
## V33417 2022-09-12 00:04:28 250.00 <NA> <NA>
## V35051 2022-09-24 15:04:48 259.00 <NA> <NA>
## V37388 2022-10-07 18:58:45 249.00 <NA> <NA>
## V40089 2022-10-22 19:33:44 249.00 <NA> <NA>
## V55239 2022-11-20 16:39:10 249.00 <NA> <NA>
## V69568 2022-12-07 02:45:09 99.00 <NA> <NA>
## V1089.2 2023-01-02 15:37:13 6.41 <NA> <NA>
## V4761.2 2023-01-07 17:53:14 259.00 <NA> <NA>
## V12536.2 2023-01-17 21:09:50 0.04 <NA> <NA>
## V18433.2 2023-01-27 03:19:36 0.54 <NA> <NA>
## V19405.2 2023-01-28 17:43:01 99.00 <NA> <NA>
## utm_content utm_source is_app_purchase user_id transaction_type
## V23345 <NA> <NA> 0 63193 1
## V27389 <NA> <NA> 0 63193 1
## V1474.1 <NA> <NA> 1 63193 1
## V1495.1 0 63193 1
## V3505.1 <NA> <NA> 1 63193 1
## V3613.1 <NA> <NA> 1 63193 1
## V7558.1 <NA> <NA> 1 63193 1
## V10360.1 <NA> <NA> 1 63193 1
## V15829.1 <NA> <NA> 1 63193 1
## V20703.1 <NA> <NA> 1 63193 1
## V22093.1 <NA> <NA> 1 63193 1
## V25518.1 <NA> <NA> 1 63193 1
## V25519.1 <NA> <NA> 1 63193 1
## V25796.1 <NA> <NA> 1 63193 1
## V26228.1 <NA> <NA> 1 63193 1
## V30637.1 <NA> <NA> 1 63193 1
## V32092 <NA> <NA> 1 63193 1
## V33097 <NA> <NA> 1 63193 1
## V33417 <NA> <NA> 1 63193 1
## V35051 <NA> <NA> 1 63193 1
## V37388 <NA> <NA> 1 63193 1
## V40089 <NA> <NA> 1 63193 1
## V55239 <NA> <NA> 1 63193 1
## V69568 <NA> <NA> 1 63193 1
## V1089.2 <NA> <NA> 0 63193 1
## V4761.2 <NA> <NA> 1 63193 1
## V12536.2 <NA> <NA> 0 63193 1
## V18433.2 <NA> <NA> 0 63193 1
## V19405.2 <NA> <NA> 1 63193 1
## credit_type credit_given_in_usd is_excess stripe_brand option_id
## V23345 0 300.00 <NA> Visa 6015
## V27389 0 275.00 <NA> Visa 16057
## V1474.1 0 275.00 <NA> Visa 12285
## V1495.1 0 100.00 <NA> Visa 19099
## V3505.1 0 55.00 <NA> Visa 8750
## V3613.1 0 275.00 <NA> Visa 16057
## V7558.1 0 275.00 <NA> Visa 16099
## V10360.1 0 275.00 <NA> Visa 16099
## V15829.1 0 275.00 <NA> Visa 16057
## V20703.1 0 275.00 <NA> Visa 16099
## V22093.1 0 275.00 <NA> Visa 10373
## V25518.1 0 110.00 <NA> Visa 29056
## V25519.1 0 110.00 <NA> Visa 29056
## V25796.1 0 275.00 <NA> Visa 16057
## V26228.1 0 275.00 <NA> Visa 16099
## V30637.1 0 300.00 <NA> Visa 16057
## V32092 0 275.00 <NA> Visa 22358
## V33097 0 350.00 <NA> Visa 37
## V33417 0 275.00 <NA> Visa 34136
## V35051 0 300.00 <NA> Visa 54
## V37388 0 325.00 <NA> Visa 60
## V40089 0 325.00 <NA> <NA> 60
## V55239 0 325.00 <NA> Visa 98
## V69568 0 110.00 <NA> Visa 103
## V1089.2 0 6.41 1 Visa 47934
## V4761.2 0 300.00 <NA> Visa 104
## V12536.2 0 0.04 1 <NA> 50087
## V18433.2 0 0.54 1 Visa 51269
## V19405.2 0 110.00 <NA> Visa 103
filter(df_redemptions, user_id == "63193")
## user_id created_at project_id
## V36414 63193 2021-11-05 21:11:58 277
## V38917 63193 2021-11-20 20:50:35 277
## V42336 63193 2021-12-11 10:17:11 687
## V43192 63193 2021-12-15 17:09:00 687
## V43297 63193 2021-12-16 09:12:56 687
## V44063 63193 2021-12-19 10:58:38 687
## V44272 63193 2021-12-20 11:32:48 687
## V44979 63193 2021-12-24 17:42:13 687
## V1442.1 63193 2022-01-10 13:39:10 687
## V1744.1 63193 2022-01-13 11:08:27 687
## V1793.1 63193 2022-01-13 17:12:38 726
## V1813.1 63193 2022-01-13 18:13:32 726
## V1816.1 63193 2022-01-13 18:14:11 726
## V1818.1 63193 2022-01-13 18:15:03 726
## V1952.1 63193 2022-01-14 12:26:35 726
## V1972.1 63193 2022-01-14 13:45:19 726
## V2451.1 63193 2022-01-16 13:13:30 687
## V3518.1 63193 2022-01-22 19:06:06 224
## V5317.1 63193 2022-02-01 11:14:25 687
## V6978.1 63193 2022-02-09 21:56:29 681
## V7601.1 63193 2022-02-12 11:47:55 687
## V7634.1 63193 2022-02-12 13:13:51 687
## V8439.1 63193 2022-02-15 16:39:09 687
## V11205.1 63193 2022-02-28 13:34:58 687
## V11371.1 63193 2022-03-01 15:04:41 726
## V15448.1 63193 2022-03-21 09:58:33 726
## V15734.1 63193 2022-03-23 12:46:38 277
## V15919.1 63193 2022-03-24 13:28:06 277
## V16230.1 63193 2022-03-25 18:56:07 277
## V16421.1 63193 2022-03-26 10:49:26 687
## V17018.1 63193 2022-03-28 11:16:18 277
## V17172.1 63193 2022-03-29 11:43:56 277
## V17378.1 63193 2022-03-30 14:45:49 277
## V17542.1 63193 2022-03-31 12:47:50 726
## V17579.1 63193 2022-03-31 15:13:44 277
## V17581.1 63193 2022-03-31 15:27:01 722
## V20066.1 63193 2022-04-11 12:07:39 708
## V20229.1 63193 2022-04-12 15:20:12 676
## V20392.1 63193 2022-04-13 13:35:43 697
## V20712.1 63193 2022-04-14 20:46:44 277
## V21076.1 63193 2022-04-16 11:16:30 687
## V21651.1 63193 2022-04-18 13:08:39 726
## V22165.1 63193 2022-04-21 13:29:31 277
## V23435.1 63193 2022-04-26 12:43:35 726
## V23462.1 63193 2022-04-26 16:16:12 726
## V23912.1 63193 2022-04-28 13:31:55 726
## V23946.1 63193 2022-04-28 15:10:20 726
## V24843.1 63193 2022-04-30 14:27:27 277
## V25315.1 63193 2022-05-01 12:53:14 687
## V25345.1 63193 2022-05-01 13:29:22 726
## V28903.1 63193 2022-05-13 12:41:46 726
## V30348.1 63193 2022-05-17 08:52:11 687
## V30406.1 63193 2022-05-17 13:16:38 277
## V31468.1 63193 2022-05-20 18:14:29 224
## V31799.1 63193 2022-05-21 11:22:13 687
## V32905.1 63193 2022-05-24 08:36:01 277
## V33562.1 63193 2022-05-26 08:25:36 277
## V33579.1 63193 2022-05-26 10:10:35 713
## V34538.1 63193 2022-05-28 09:30:27 687
## V35470.1 63193 2022-05-29 15:32:29 687
## V36333.1 63193 2022-05-31 09:02:57 687
## V37120.1 63193 2022-06-02 10:31:41 687
## V37534.1 63193 2022-06-03 19:38:19 687
## V38010.1 63193 2022-06-05 10:26:11 687
## V39395.1 63193 2022-06-10 18:04:19 277
## V39680.1 63193 2022-06-11 11:46:01 687
## V40287.1 63193 2022-06-12 20:03:09 277
## V41131.1 63193 2022-06-16 15:10:23 720
## V42894.1 63193 2022-06-21 19:02:33 695
## V43020.1 63193 2022-06-22 10:20:38 708
## V43083.1 63193 2022-06-22 15:04:04 745
## V43089.1 63193 2022-06-22 16:09:43 745
## V43338.1 63193 2022-06-23 14:53:02 745
## V44795.1 63193 2022-06-26 19:16:26 277
## V45443.1 63193 2022-06-29 13:02:08 745
## V45446.1 63193 2022-06-29 13:05:56 745
## V49181 63193 2022-07-11 13:46:29 702
## V49189 63193 2022-07-11 14:43:56 706
## V49191 63193 2022-07-11 14:49:04 706
## V49199 63193 2022-07-11 16:16:28 706
## V49446 63193 2022-07-12 19:34:33 711
## V49575 63193 2022-07-13 13:46:00 731
## V49577 63193 2022-07-13 13:58:03 731
## V50077 63193 2022-07-15 15:28:31 311
## V50122 63193 2022-07-15 17:56:37 687
## V50705 63193 2022-07-17 12:07:59 687
## V50993 63193 2022-07-18 14:21:16 255
## V51087 63193 2022-07-18 20:51:56 277
## V51404 63193 2022-07-20 13:26:40 709
## V51407 63193 2022-07-20 13:38:55 709
## V51414 63193 2022-07-20 14:00:11 310
## V52253 63193 2022-07-23 10:13:48 687
## V52323 63193 2022-07-23 13:49:36 687
## V53028 63193 2022-07-25 14:19:17 684
## V53445 63193 2022-07-27 11:34:52 249
## V54742 63193 2022-07-31 10:07:34 687
## V55485 63193 2022-08-03 20:16:53 277
## V56278 63193 2022-08-06 18:13:21 687
## V57178 63193 2022-08-10 16:17:13 724
## V57347 63193 2022-08-11 08:45:31 687
## V59250 63193 2022-08-18 14:01:26 249
## V59473 63193 2022-08-19 13:03:16 747
## V59764 63193 2022-08-20 10:12:47 687
## V60232 63193 2022-08-21 14:36:22 687
## V61034 63193 2022-08-25 09:09:20 687
## V61881 63193 2022-08-28 10:32:05 687
## V62322 63193 2022-08-30 14:11:17 736
## V62325 63193 2022-08-30 14:26:14 736
## V62870 63193 2022-09-01 21:17:01 736
## V63790 63193 2022-09-05 11:41:00 687
## V64396 63193 2022-09-08 13:40:06 736
## V64605 63193 2022-09-09 11:49:24 759
## V65110 63193 2022-09-10 19:16:14 277
## V65280 63193 2022-09-11 12:38:44 687
## V65389 63193 2022-09-11 19:04:47 224
## V65530 63193 2022-09-12 14:09:38 760
## V65687 63193 2022-09-13 12:28:53 687
## V65713 63193 2022-09-13 15:08:43 736
## V66037 63193 2022-09-15 09:05:03 687
## V66109 63193 2022-09-15 14:40:42 753
## V66511 63193 2022-09-16 20:56:37 687
## V66623 63193 2022-09-17 11:53:58 687
## V67536 63193 2022-09-21 12:13:02 771
## V68802 63193 2022-09-25 13:46:31 687
## V69003 63193 2022-09-26 09:59:20 753
## V69024 63193 2022-09-26 12:02:11 753
## V69049 63193 2022-09-26 13:33:24 753
## V69087 63193 2022-09-26 15:59:17 753
## V69230 63193 2022-09-27 12:04:03 753
## V69250 63193 2022-09-27 13:38:42 753
## V69258 63193 2022-09-27 14:07:26 753
## V69653 63193 2022-09-29 08:57:16 687
## V69710 63193 2022-09-29 14:02:56 753
## V69711 63193 2022-09-29 14:06:34 753
## V69914 63193 2022-09-30 12:13:29 766
## V70272 63193 2022-10-01 10:33:43 687
## V70640 63193 2022-10-02 09:55:04 687
## V70922 63193 2022-10-03 10:02:55 753
## V70983 63193 2022-10-03 16:45:10 766
## V71026 63193 2022-10-03 19:58:52 277
## V71091 63193 2022-10-04 11:43:24 753
## V71146 63193 2022-10-04 14:14:56 753
## V71156 63193 2022-10-04 15:11:46 766
## V71305 63193 2022-10-05 10:07:29 736
## V71362 63193 2022-10-05 14:20:36 766
## V71363 63193 2022-10-05 14:33:55 766
## V71364 63193 2022-10-05 14:43:48 766
## V71601 63193 2022-10-06 13:32:44 766
## V71632 63193 2022-10-06 16:07:37 766
## V71859 63193 2022-10-07 13:01:54 766
## V71884 63193 2022-10-07 14:02:56 766
## V71889 63193 2022-10-07 14:33:24 766
## V71893 63193 2022-10-07 14:48:03 766
## V72240 63193 2022-10-08 11:49:59 687
## V72467 63193 2022-10-08 19:37:18 277
## V73195 63193 2022-10-11 13:00:58 766
## V73221 63193 2022-10-11 15:16:17 776
## V73454 63193 2022-10-12 15:37:04 766
## V73881 63193 2022-10-14 12:58:06 687
## V74912 63193 2022-10-17 10:49:29 687
## V75202 63193 2022-10-18 16:25:46 776
## V75411 63193 2022-10-19 14:01:55 766
## V75645 63193 2022-10-20 14:18:50 766
## V75673 63193 2022-10-20 17:11:16 777
## V76319 63193 2022-10-22 14:34:09 687
## V76898 63193 2022-10-24 09:50:14 687
## V77372 63193 2022-10-26 12:37:23 676
## V77678 63193 2022-10-27 13:43:23 780
## V77681 63193 2022-10-27 13:47:11 780
## V78488 63193 2022-10-29 14:28:05 687
## V79097 63193 2022-10-30 19:11:50 277
## V79686 63193 2022-11-02 10:14:23 736
## V79689 63193 2022-11-02 10:24:32 785
## V79708 63193 2022-11-02 12:06:22 726
## V79709 63193 2022-11-02 12:08:44 726
## V79710 63193 2022-11-02 12:11:10 726
## V82593 63193 2022-11-09 13:23:29 269
## V83294 63193 2022-11-11 10:35:26 687
## V85065 63193 2022-11-14 14:46:11 786
## V85068 63193 2022-11-14 14:57:25 786
## V85423 63193 2022-11-15 14:49:24 786
## V90361 63193 2022-11-22 13:20:01 697
## V95175 63193 2022-11-30 13:31:28 687
## V95537 63193 2022-12-01 07:52:58 687
## V99168 63193 2022-12-06 13:44:24 791
## V99195 63193 2022-12-06 14:07:30 791
## V99453 63193 2022-12-06 21:24:20 277
## V99523 63193 2022-12-07 10:11:30 803
## V103198 63193 2022-12-12 16:14:56 796
## V104057 63193 2022-12-14 10:55:49 796
## V104072 63193 2022-12-14 11:30:46 796
## V104163 63193 2022-12-14 13:16:23 802
## V104239 63193 2022-12-14 15:03:27 791
## V104240 63193 2022-12-14 15:05:11 791
## V104340 63193 2022-12-14 18:39:39 791
## V104748 63193 2022-12-15 13:47:13 791
## V106109 63193 2022-12-17 12:12:44 687
## V108449 63193 2022-12-20 12:38:43 687
## V692.2 63193 2023-01-02 09:37:15 687
## V1406.2 63193 2023-01-03 13:28:03 802
## V3753.2 63193 2023-01-07 11:54:49 687
## V4849.2 63193 2023-01-08 09:52:34 687
## V6154.2 63193 2023-01-10 14:11:49 708
## V8535.2 63193 2023-01-14 12:34:35 687
## V10361.2 63193 2023-01-16 12:18:34 687
## V11059.2 63193 2023-01-17 15:09:50 811
## V11529.2 63193 2023-01-18 15:26:46 815
## V16777.2 63193 2023-01-26 12:09:19 811
## V16780.2 63193 2023-01-26 12:11:51 811
## V16794.2 63193 2023-01-26 12:21:40 811
## V16812.2 63193 2023-01-26 12:38:55 811
## V16813.2 63193 2023-01-26 12:39:57 811
## V16909.2 63193 2023-01-26 15:12:12 812
## V16910.2 63193 2023-01-26 15:13:47 812
## V16911.2 63193 2023-01-26 15:14:30 812
## V16946.2 63193 2023-01-26 16:45:43 811
## V16947.2 63193 2023-01-26 16:46:58 811
## V16949.2 63193 2023-01-26 16:48:11 811
## V17268.2 63193 2023-01-26 21:19:39 681
## V18530.2 63193 2023-01-28 12:53:28 687
## V20523.2 63193 2023-01-30 16:14:07 782
## project.name
## V36414 The Market District
## V38917 The Market District
## V42336 Two Hands
## V43192 Two Hands
## V43297 Two Hands
## V44063 Two Hands
## V44272 Two Hands
## V44979 Two Hands
## V1442.1 Two Hands
## V1744.1 Two Hands
## V1793.1 City Winery
## V1813.1 City Winery
## V1816.1 City Winery
## V1818.1 City Winery
## V1952.1 City Winery
## V1972.1 City Winery
## V2451.1 Two Hands
## V3518.1 Juliet Italian Kitchen
## V5317.1 Two Hands
## V6978.1 Salvation Pizza
## V7601.1 Two Hands
## V7634.1 Two Hands
## V8439.1 Two Hands
## V11205.1 Two Hands
## V11371.1 City Winery
## V15448.1 City Winery
## V15734.1 The Market District
## V15919.1 The Market District
## V16230.1 The Market District
## V16421.1 Two Hands
## V17018.1 The Market District
## V17172.1 The Market District
## V17378.1 The Market District
## V17542.1 City Winery
## V17579.1 The Market District
## V17581.1 Citizens Manhattan West
## V20066.1 Jose Andres Restaurants
## V20229.1 50 Eggs Hospitality Group
## V20392.1 Parker Hospitality
## V20712.1 The Market District
## V21076.1 Two Hands
## V21651.1 City Winery
## V22165.1 The Market District
## V23435.1 City Winery
## V23462.1 City Winery
## V23912.1 City Winery
## V23946.1 City Winery
## V24843.1 The Market District
## V25315.1 Two Hands
## V25345.1 City Winery
## V28903.1 City Winery
## V30348.1 Two Hands
## V30406.1 The Market District
## V31468.1 Juliet Italian Kitchen
## V31799.1 Two Hands
## V32905.1 The Market District
## V33562.1 The Market District
## V33579.1 Silk Road Hospitality
## V34538.1 Two Hands
## V35470.1 Two Hands
## V36333.1 Two Hands
## V37120.1 Two Hands
## V37534.1 Two Hands
## V38010.1 Two Hands
## V39395.1 The Market District
## V39680.1 Two Hands
## V40287.1 The Market District
## V41131.1 The Electric Jane
## V42894.1 Matthew Kenney
## V43020.1 Jose Andres Restaurants
## V43083.1 Parched Hospitality Group
## V43089.1 Parched Hospitality Group
## V43338.1 Parched Hospitality Group
## V44795.1 The Market District
## V45443.1 Parched Hospitality Group
## V45446.1 Parched Hospitality Group
## V49181 Apero
## V49189 Parson's
## V49191 Parson's
## V49199 Parson's
## V49446 Higher Ground
## V49575 Strangebird Hospitality
## V49577 Strangebird Hospitality
## V50077 Tiger, Grateful Bread & Solomon's
## V50122 Two Hands
## V50705 Two Hands
## V50993 Paraiso
## V51087 The Market District
## V51404 Zandra's
## V51407 Zandra's
## V51414 Zola
## V52253 Two Hands
## V52323 Two Hands
## V53028 Superette
## V53445 Sheesh
## V54742 Two Hands
## V55485 The Market District
## V56278 Two Hands
## V57178 The Monkey King
## V57347 Two Hands
## V59250 Sheesh
## V59473 Gregory Gourdet Restaurants
## V59764 Two Hands
## V60232 Two Hands
## V61034 Two Hands
## V61881 Two Hands
## V62322 Le Pigeon
## V62325 Le Pigeon
## V62870 Le Pigeon
## V63790 Two Hands
## V64396 Le Pigeon
## V64605 Jrk!
## V65110 The Market District
## V65280 Two Hands
## V65389 Juliet Italian Kitchen
## V65530 Justin Queso's
## V65687 Two Hands
## V65713 Le Pigeon
## V66037 Two Hands
## V66109 Back of the House
## V66511 Two Hands
## V66623 Two Hands
## V67536 HopMonk
## V68802 Two Hands
## V69003 Back of the House
## V69024 Back of the House
## V69049 Back of the House
## V69087 Back of the House
## V69230 Back of the House
## V69250 Back of the House
## V69258 Back of the House
## V69653 Two Hands
## V69710 Back of the House
## V69711 Back of the House
## V69914 Ethan Stowell
## V70272 Two Hands
## V70640 Two Hands
## V70922 Back of the House
## V70983 Ethan Stowell
## V71026 The Market District
## V71091 Back of the House
## V71146 Back of the House
## V71156 Ethan Stowell
## V71305 Le Pigeon
## V71362 Ethan Stowell
## V71363 Ethan Stowell
## V71364 Ethan Stowell
## V71601 Ethan Stowell
## V71632 Ethan Stowell
## V71859 Ethan Stowell
## V71884 Ethan Stowell
## V71889 Ethan Stowell
## V71893 Ethan Stowell
## V72240 Two Hands
## V72467 The Market District
## V73195 Ethan Stowell
## V73221 Garrett Hospitality
## V73454 Ethan Stowell
## V73881 Two Hands
## V74912 Two Hands
## V75202 Garrett Hospitality
## V75411 Ethan Stowell
## V75645 Ethan Stowell
## V75673 Reem's
## V76319 Two Hands
## V76898 Two Hands
## V77372 50 Eggs Hospitality Group
## V77678 Boujis Group
## V77681 Boujis Group
## V78488 Two Hands
## V79097 The Market District
## V79686 Le Pigeon
## V79689 Major Food Group
## V79708 City Winery
## V79709 City Winery
## V79710 City Winery
## V82593 Bar Spero
## V83294 Two Hands
## V85065 The Butcher's Daughter
## V85068 The Butcher's Daughter
## V85423 The Butcher's Daughter
## V90361 Parker Hospitality
## V95175 Two Hands
## V95537 Two Hands
## V99168 101 Hospitality
## V99195 101 Hospitality
## V99453 The Market District
## V99523 Broad Street Oyster Co.
## V103198 Great White
## V104057 Great White
## V104072 Great White
## V104163 Winston House / The Waterfront
## V104239 101 Hospitality
## V104240 101 Hospitality
## V104340 101 Hospitality
## V104748 101 Hospitality
## V106109 Two Hands
## V108449 Two Hands
## V692.2 Two Hands
## V1406.2 Winston House / The Waterfront
## V3753.2 Two Hands
## V4849.2 Two Hands
## V6154.2 Jose Andres Restaurants
## V8535.2 Two Hands
## V10361.2 Two Hands
## V11059.2 Rosebud Restaurants
## V11529.2 Montclair Hospitality Group
## V16777.2 Rosebud Restaurants
## V16780.2 Rosebud Restaurants
## V16794.2 Rosebud Restaurants
## V16812.2 Rosebud Restaurants
## V16813.2 Rosebud Restaurants
## V16909.2 Juvia Group
## V16910.2 Juvia Group
## V16911.2 Juvia Group
## V16946.2 Rosebud Restaurants
## V16947.2 Rosebud Restaurants
## V16949.2 Rosebud Restaurants
## V17268.2 Salvation Pizza
## V18530.2 Two Hands
## V20523.2 Rosalia's Kitchen
## Location project_location_id
## V36414 TenTen 135
## V38917 TenTen 135
## V42336 Two Hands - Austin South Congress 187
## V43192 Two Hands - Austin South Congress 187
## V43297 Two Hands - Austin South Congress 187
## V44063 Two Hands - Austin South Congress 187
## V44272 Two Hands - Austin South Congress 187
## V44979 Two Hands - Austin South Congress 187
## V1442.1 Two Hands - Austin South Congress 187
## V1744.1 Two Hands - Austin South Congress 187
## V1793.1 City Winery - Nashville 3389
## V1813.1 City Winery - Atlanta 3392
## V1816.1 City Winery - Philadelphia 3394
## V1818.1 City Winery - Greenway (MA) 3391
## V1952.1 City Winery - Nashville 3389
## V1972.1 City Winery - Nashville 3389
## V2451.1 Two Hands - Austin South Congress 187
## V3518.1 Juliet Italian Kitchen - Barton Springs 2603
## V5317.1 Two Hands - Austin South Congress 187
## V6978.1 Salvation Rainey 176
## V7601.1 Two Hands - Austin South Congress 187
## V7634.1 Two Hands - Austin South Congress 187
## V8439.1 Two Hands - Austin South Congress 187
## V11205.1 Two Hands - Austin South Congress 187
## V11371.1 City Winery - Nashville 3389
## V15448.1 City Winery - Nashville 3389
## V15734.1 The Well 3266
## V15919.1 The Well 3266
## V16230.1 The Well 3266
## V16421.1 Two Hands - Austin South Congress 187
## V17018.1 The Well 3266
## V17172.1 The Well 3266
## V17378.1 The Well 3266
## V17542.1 City Winery - Nashville 3389
## V17579.1 The Well 3266
## V17581.1 Plant Nation 3369
## V20066.1 Oyamel DC 3241
## V20229.1 Yardbird - Dallas 180
## V20392.1 The Hampton Social - S. Barrington 2612
## V20712.1 TenTen 135
## V21076.1 Two Hands - Austin South Congress 187
## V21651.1 City Winery - Nashville 3389
## V22165.1 The Well 3266
## V23435.1 City Winery - Nashville 3389
## V23462.1 City Winery - Nashville 3389
## V23912.1 City Winery - Nashville 3389
## V23946.1 City Winery - Nashville 3389
## V24843.1 The Well 3266
## V25315.1 Two Hands - Austin South Congress 187
## V25345.1 City Winery - Nashville 3389
## V28903.1 City Winery - Nashville 3389
## V30348.1 Two Hands - Austin South Congress 187
## V30406.1 The Well 3266
## V31468.1 Juliet Italian Kitchen - Barton Springs 2603
## V31799.1 Two Hands - Austin South Congress 187
## V32905.1 The Well 3266
## V33562.1 The Well 3266
## V33579.1 District Kitchen Slaughter Lane 3278
## V34538.1 Two Hands - Austin South Congress 187
## V35470.1 Two Hands - Austin South Congress 187
## V36333.1 Two Hands - Austin South Congress 187
## V37120.1 Two Hands - Austin South Congress 187
## V37534.1 Two Hands - Austin South Congress 187
## V38010.1 Two Hands - Austin South Congress 187
## V39395.1 Mayfair 4713
## V39680.1 Two Hands - Austin South Congress 187
## V40287.1 TenTen 135
## V41131.1 Electric Jane 3346
## V42894.1 SESTINA - LA 2596
## V43020.1 Pigtail Chicago 4717
## V43083.1 Hole in the Wall, Murray Hill 4737
## V43089.1 Hole in the Wall, FiDi 4736
## V43338.1 Hole in the Wall, Flatiron 4738
## V44795.1 The Well 3266
## V45443.1 Isla & Co, Midtown 4741
## V45446.1 Daintree 4742
## V49181 Apero 2631
## V49189 Parson’s West Town 3234
## V49191 Parson's Andersonville 3235
## V49199 Parson’s Lincoln Park 3233
## V49446 Higher Ground, Austin 3263
## V49575 Nat's 4615
## V49577 Orchard Townhouse 4614
## V50077 Tiger Bar & Restaurant 141
## V50122 Two Hands - Austin South Congress 187
## V50705 Two Hands - Austin South Congress 187
## V50993 Paraiso 171
## V51087 TenTen 135
## V51404 Zandra's Manassas 3250
## V51407 Zandra's Haymarket 3249
## V51414 Zola 2647
## V52253 Two Hands - Austin South Congress 187
## V52323 Two Hands - Austin South Congress 187
## V53028 Superette 2644
## V53445 Sheesh - Chantilly 88
## V54742 Two Hands - Austin South Congress 187
## V55485 TenTen 135
## V56278 Two Hands - Austin South Congress 187
## V57178 The Monkey King 3365
## V57347 Two Hands - Austin South Congress 187
## V59250 Sheesh - Mosaic 89
## V59473 Kann 4841
## V59764 Two Hands - Austin South Congress 187
## V60232 Two Hands - Austin South Congress 187
## V61034 Two Hands - Austin South Congress 187
## V61881 Two Hands - Austin South Congress 187
## V62322 Le Pigeon 4698
## V62325 Le Pigeon 4698
## V62870 Canard 4699
## V63790 Two Hands - Austin South Congress 187
## V64396 Le Pigeon 4698
## V64605 Jrk! 4856
## V65110 TenTen 135
## V65280 Two Hands - Austin South Congress 187
## V65389 Juliet Italian Kitchen - Barton Springs 2603
## V65530 Justin Queso's 4857
## V65687 Two Hands - Austin South Congress 187
## V65713 Le Pigeon 4698
## V66037 Two Hands - Austin South Congress 187
## V66109 Beretta Valencia 4824
## V66511 Two Hands - Austin South Congress 187
## V66623 Two Hands - Austin South Congress 187
## V67536 Hopmonk Tavern - Sonoma 4907
## V68802 Two Hands - Austin South Congress 187
## V69003 Delarosa Downtown 4827
## V69024 Flores Corte Madera 4830
## V69049 Flores Union 4829
## V69087 Wildseed Palo Alto 4823
## V69230 Delarosa Bishop Ranch 4828
## V69250 Beretta Divisadero 4825
## V69258 Starbelly 4833
## V69653 Two Hands - Austin South Congress 187
## V69710 El Techo 4832
## V69711 Lolinda 4831
## V69914 Rione XIII 4893
## V70272 Two Hands - Austin South Congress 187
## V70640 Two Hands - Austin South Congress 187
## V70922 A | Mano 4834
## V70983 How to Cook a Wolf (Queen Anne) 4902
## V71026 TenTen 135
## V71091 Delarosa Marina 4826
## V71146 Wildseed Union 4822
## V71156 Ballard Pizza Co. (Woodinville) 4889
## V71305 Canard - Oregon City 4756
## V71362 Tavolàta Spokane 4897
## V71363 Ballard Pizza Co. 4888
## V71364 Cortina 4894
## V71601 Ballard Pizza Co. (Frēlard) 4890
## V71632 Tavolàta Capitol Hill 4896
## V71859 Tavolàta Belltown 4895
## V71884 Tavolàta Stone Way 4898
## V71889 How to Cook a Wolf (Madison Park) 4901
## V71893 Staple & Fancy 4899
## V72240 Two Hands - Austin South Congress 187
## V72467 The Well 3266
## V73195 Red Cow 4900
## V73221 Ya Mas! Taverna 4919
## V73454 The Victor Tavern (South Lake Union) 4904
## V73881 Two Hands - Austin South Congress 187
## V74912 Two Hands - Austin South Congress 187
## V75202 No Man's Land 4918
## V75411 The Victor Tavern (Downtown Seattle) 4891
## V75645 Victory Burger 4903
## V75673 Reem's (Mission St.) 4920
## V76319 Two Hands - Austin South Congress 187
## V76898 Two Hands - Austin South Congress 187
## V77372 Yardbird - Chicago 4948
## V77678 Olivetta 4924
## V77681 The Draycott 4926
## V78488 Two Hands - Austin South Congress 187
## V79097 TenTen 135
## V79686 Canard 4699
## V79689 Sadelle's Dallas 4958
## V79708 City Winery - Grand Central 4867
## V79709 City Winery - City Jams 4869
## V79710 City Winery - Cornelius 4868
## V82593 Bar Spero 4974
## V83294 Two Hands - Austin South Congress 187
## V85065 The Butcher's Daughter - Brooklyn 4962
## V85068 The Butcher's Daughter - Nolita 4960
## V85423 The Butcher's Daughter - West Village 4963
## V90361 Nisos Mediterranean 4880
## V95175 Two Hands - Austin South Congress 187
## V95537 Two Hands - Nashville 4949
## V99168 Michele's 4976
## V99195 Michele's 4976
## V99453 TenTen 135
## V99523 Broad Street Oyster Co. (Malibu) 5005
## V103198 Great White - Venice 4985
## V104057 Great White - Larchmont 4986
## V104072 Great White - Melrose 4987
## V104163 The Waterfront 5004
## V104239 The Conservatory at Ivy City 5013
## V104240 Gravitas 4975
## V104340 Baker's Daughter (Ivy City) 4977
## V104748 Baker's Daughter (Eaton Hotel) 4978
## V106109 Two Hands - Austin South Congress 187
## V108449 Two Hands - Austin South Congress 187
## V692.2 Two Hands - Austin South Congress 187
## V1406.2 Winston House 5003
## V3753.2 Two Hands - Austin South Congress 187
## V4849.2 Two Hands - Austin South Congress 187
## V6154.2 Bazaar Meat - Chicago 5073
## V8535.2 Two Hands - Austin South Congress 187
## V10361.2 Two Hands - Austin South Congress 187
## V11059.2 Carmine's Rush Street 5038
## V11529.2 Ani Ramen - Jersey City 5064
## V16777.2 Rosetta Italian 5045
## V16780.2 Rosebud Naperville 5043
## V16794.2 Carmine's Rosemont 5039
## V16812.2 Rosebud on Rush 5041
## V16813.2 Rosebud Randolph 5040
## V16909.2 Sushi Garage Las Olas 5050
## V16910.2 Sushi Garage Miami Beach 5048
## V16911.2 Sushi Garage Cocowalk 5049
## V16946.2 Rosebud Cafe 5042
## V16947.2 Rosebud Lemont 5046
## V16949.2 Rosebud Deerfield 5044
## V17268.2 Salvation Rainey 176
## V18530.2 Two Hands - Austin South Congress 187
## V20523.2 Rosalia's Kitchen 4945
## city state credit_transaction_id total_redemption_amount
## V36414 Austin TX 326293 152.64
## V38917 Austin TX 335106 146.14
## V42336 Austin TX 356213 69.28
## V43192 Austin TX 359654 2.00
## V43297 Austin TX 360363 2.00
## V44063 Austin TX 369954 27.07
## V44272 Austin TX 371710 2.00
## V44979 Austin TX 376369 2.00
## V1442.1 Austin TX 383900 2.00
## V1744.1 Austin TX 385347 2.00
## V1793.1 Nashville TN 385502 2.00
## V1813.1 Atlanta GA 385504 2.00
## V1816.1 Philadelphia PA 385507 2.00
## V1818.1 Boston MA 385512 2.00
## V1952.1 Nashville TN 385950 2.00
## V1972.1 Nashville TN 385983 2.00
## V2451.1 Austin TX 387126 121.79
## V3518.1 Austin TX 390302 315.05
## V5317.1 Austin TX 394945 2.00
## V6978.1 Austin TX 399264 33.56
## V7601.1 Austin TX 403100 76.31
## V7634.1 Austin TX 403152 28.14
## V8439.1 Austin TX 405196 2.00
## V11205.1 Austin TX 414275 2.00
## V11371.1 Nashville TN 415678 2.00
## V15448.1 Nashville TN 428779 2.00
## V15734.1 Austin TX 438497 9.75
## V15919.1 Austin TX 439064 6.50
## V16230.1 Austin TX 439781 41.14
## V16421.1 Austin TX 440114 22.74
## V17018.1 Austin TX 441173 11.91
## V17172.1 Austin TX 441847 14.07
## V17378.1 Austin TX 443134 3.25
## V17542.1 Nashville TN 443886 2.00
## V17579.1 Austin TX 443972 14.07
## V17581.1 New York NY 443948 11.92
## V20066.1 Washington DC 455472 5.50
## V20229.1 Dallas TX 455993 6.50
## V20392.1 S. Barrington IL 456620 3.34
## V20712.1 Austin TX 457867 289.02
## V21076.1 Austin TX 458700 5.41
## V21651.1 Nashville TN 459735 2.00
## V22165.1 Austin TX 460927 26.00
## V23435.1 Nashville TN 463439 2.00
## V23462.1 Nashville TN 463519 2.00
## V23912.1 Nashville TN 469092 2.00
## V23946.1 Nashville TN 469185 2.00
## V24843.1 Austin TX 471495 21.66
## V25315.1 Austin TX 472470 59.55
## V25345.1 Nashville TN 472511 2.00
## V28903.1 Nashville TN 488362 2.00
## V30348.1 Austin TX 491923 31.40
## V30406.1 Austin TX 492600 6.50
## V31468.1 Austin TX 499252 48.71
## V31799.1 Austin TX 499917 65.48
## V32905.1 Austin TX 502344 14.07
## V33562.1 Austin TX 504137 28.14
## V33579.1 Austin TX 504167 4.32
## V34538.1 Austin TX 507412 28.15
## V35470.1 Austin TX 509440 34.65
## V36333.1 Austin TX 511471 18.41
## V37120.1 Austin TX 513174 25.99
## V37534.1 Austin TX 513981 46.55
## V38010.1 Austin TX 514877 54.67
## V39395.1 Austin TX 518271 6.50
## V39680.1 Austin TX 518835 25.98
## V40287.1 Austin TX 520079 145.05
## V41131.1 Nashville TN 521982 19.88
## V42894.1 Culver City CA 526135 88.28
## V43020.1 Chicago IL 526367 5.59
## V43083.1 New York NY 526463 3.27
## V43089.1 New York NY 526488 3.27
## V43338.1 New York NY 527084 3.27
## V44795.1 Austin TX 530368 59.55
## V45443.1 New York NY 531731 4.90
## V45446.1 New York NY 531733 8.71
## V49181 Washington DC 539482 16.50
## V49189 Chicago IL 539517 4.43
## V49191 Chicago IL 539520 13.29
## V49199 Chicago IL 539541 14.52
## V49446 Austin TX 540087 21.64
## V49575 New York NY 540313 5.44
## V49577 New York NY 540318 4.90
## V50077 Roseville CA 541343 8.16
## V50122 Austin TX 541363 50.88
## V50705 Austin TX 542501 36.25
## V50993 Washington DC 543013 3.30
## V51087 Austin TX 543188 140.72
## V51404 Manassas VA 543852 7.70
## V51407 Haymarket VA 543856 5.78
## V51414 Palo Alto CA 543909 9.82
## V52253 Austin TX 545644 25.43
## V52323 Austin TX 545788 86.59
## V53028 Balston VA 547113 2.00
## V53445 Chantilly VA 547929 2.01
## V54742 Austin TX 550448 51.41
## V55485 Austin TX 552201 111.49
## V56278 Austin TX 553572 35.73
## V57178 Brooklyn NY 555229 5.44
## V57347 Austin TX 555532 27.60
## V59250 Falls Church VA 559134 9.54
## V59473 Portland OR 559724 15.00
## V59764 Austin TX 560193 58.45
## V60232 Austin TX 561020 25.43
## V61034 Austin TX 562451 25.43
## V61881 Austin TX 564042 26.52
## V62322 Portland OR 564949 2.00
## V62325 Portland OR 564954 1.00
## V62870 Portland OR 565983 145.00
## V63790 Austin TX 567752 25.43
## V64396 Portland OR 569062 2.00
## V64605 Aventura FL 569411 4.23
## V65110 Austin TX 570298 100.67
## V65280 Austin TX 570598 33.02
## V65389 Austin TX 570830 44.39
## V65530 West Hollywood CA 571151 16.54
## V65687 Austin TX 571440 30.21
## V65713 Portland OR 571525 2.00
## V66037 Austin TX 572152 17.86
## V66109 San Francisco CA 572301 5.70
## V66511 Austin TX 572984 126.65
## V66623 Austin TX 573228 75.78
## V67536 Sonoma CA 574930 19.62
## V68802 Austin TX 577251 106.08
## V69003 San Francisco CA 577673 7.98
## V69024 Corte Madera CA 577723 5.61
## V69049 San Francisco CA 577759 17.10
## V69087 Palo Alto CA 577827 7.87
## V69230 San Francisco CA 578112 16.80
## V69250 San Francisco CA 578153 14.83
## V69258 San Francisco CA 578174 4.58
## V69653 Austin TX 578951 26.52
## V69710 San Francisco CA 579057 14.83
## V69711 San Francisco CA 579059 14.89
## V69914 Seattle WA 579499 18.34
## V70272 Austin TX 580079 70.36
## V70640 Austin TX 580715 28.68
## V70922 San Francisco CA 581241 13.74
## V70983 Seattle WA 581366 6.88
## V71026 Austin TX 581423 159.13
## V71091 San Francisco CA 581604 14.83
## V71146 San Francisco CA 581652 6.88
## V71156 Woodinville WA 581681 28.62
## V71305 Oregon City OR 581972 2.00
## V71362 Spokane WA 582063 7.64
## V71363 Seattle WA 582070 3.44
## V71364 Seattle WA 582072 9.17
## V71601 Seattle WA 582545 3.44
## V71632 Seattle WA 582613 8.06
## V71859 Seattle WA 583038 27.52
## V71884 Seattle WA 583074 4.59
## V71889 Seattle WA 583084 6.88
## V71893 Seattle WA 583095 9.17
## V72240 Austin TX 583776 75.23
## V72467 Austin TX 584176 44.39
## V73195 Seattle WA 585582 9.20
## V73221 Ft. Lauderdale FL 585570 20.33
## V73454 Seattle WA 586031 10.31
## V73881 Austin TX 586759 27.60
## V74912 Austin TX 588652 33.55
## V75202 Ft. Lauderdale FL 589189 18.19
## V75411 Seattle WA 589640 10.31
## V75645 Spokane WA 590127 5.44
## V75673 San Francisco CA 590242 2.62
## V76319 Austin TX 591380 63.87
## V76898 Austin TX 592386 26.52
## V77372 Chicago IL 593317 1.12
## V77678 West Hollywood CA 593886 22.46
## V77681 Pacific Palisades CA 593888 12.05
## V78488 Austin TX 595405 121.24
## V79097 Austin TX 596562 139.63
## V79686 Portland OR 597770 2.00
## V79689 Dallas TX 597701 32.48
## V79708 New York NY 597721 20.69
## V79709 New York NY 597722 9.80
## V79710 New York NY 597724 22.86
## V82593 Washington DC DC 603571 21.28
## V83294 Austin TX 605040 26.52
## V85065 New York NY 608798 18.51
## V85068 New York NY 608805 13.06
## V85423 New York NY 609542 15.24
## V90361 Chicago IL 621472 15.65
## V95175 Austin TX 633794 26.52
## V95537 Nashville TN 634652 16.39
## V99168 Washington DC 642528 15.40
## V99195 Washington DC 642594 15.40
## V99453 Austin TX 643200 127.73
## V99523 Malibu CA 643607 2.00
## V103198 Venice CA 652215 4.38
## V104057 Los Angeles CA 654461 0.76
## V104072 West Hollywood CA 654521 11.02
## V104163 Venice CA 654641 1.14
## V104239 Washington DC 654572 19.80
## V104240 Washington DC 654574 17.60
## V104340 Washington DC 654834 3.30
## V104748 Washington DC 655991 3.30
## V106109 Austin TX 659582 38.43
## V108449 Austin TX 665583 30.85
## V692.2 Austin TX 688371 47.09
## V1406.2 Venice CA 690101 1.14
## V3753.2 Austin TX 695167 69.66
## V4849.2 Austin TX 697591 26.52
## V6154.2 Chicago IL 700534 4.47
## V8535.2 Austin TX 705778 30.04
## V10361.2 Austin TX 709830 67.66
## V11059.2 Chicago IL 711365 25.04
## V11529.2 Jersey City NJ 712385 14.25
## V16777.2 Chicago IL 724270 1.00
## V16780.2 Naperville IL 724276 1.00
## V16794.2 Rosemont IL 724289 1.00
## V16812.2 Chicago IL 724314 1.00
## V16813.2 Chicago IL 724320 1.00
## V16909.2 Ft. Lauderdale FL 724421 3.24
## V16910.2 Miami Beach FL 724424 15.26
## V16911.2 Miami FL 724425 5.40
## V16946.2 Chicago IL 724557 1.00
## V16947.2 Lemont IL 724558 1.00
## V16949.2 Deerfield IL 724559 1.00
## V17268.2 Austin TX 725164 31.66
## V18530.2 Austin TX 728103 86.07
## V20523.2 Miramar FL 732575 1.00
## tip Venue.Type...Detail Check.Average Service.Type
## V36414 30.52 Casual Fine Dining Mid Full Service
## V38917 29.22 Casual Fine Dining Mid Full Service
## V42336 13.85 Casual Dining Mid Full Service
## V43192 NA Casual Dining Mid Full Service
## V43297 NA Casual Dining Mid Full Service
## V44063 5.95 Casual Dining Mid Full Service
## V44272 NA Casual Dining Mid Full Service
## V44979 NA Casual Dining Mid Full Service
## V1442.1 NA Casual Dining Mid Full Service
## V1744.1 NA Casual Dining Mid Full Service
## V1793.1 NA Casual Fine Dining High Full Service
## V1813.1 NA Casual Fine Dining High Full Service
## V1816.1 NA Casual Fine Dining High Full Service
## V1818.1 NA Casual Fine Dining High Full Service
## V1952.1 NA Casual Fine Dining High Full Service
## V1972.1 NA Casual Fine Dining High Full Service
## V2451.1 24.35 Casual Dining Mid Full Service
## V3518.1 63.01 Unknown Mid Unknown
## V5317.1 NA Casual Dining Mid Full Service
## V6978.1 5.58 Casual Dining Very Low Full Service
## V7601.1 15.26 Casual Dining Mid Full Service
## V7634.1 5.62 Casual Dining Mid Full Service
## V8439.1 NA Casual Dining Mid Full Service
## V11205.1 NA Casual Dining Mid Full Service
## V11371.1 NA Casual Fine Dining High Full Service
## V15448.1 NA Casual Fine Dining High Full Service
## V15734.1 2.00 Casual Fine Dining Mid Full Service
## V15919.1 2.00 Casual Fine Dining Mid Full Service
## V16230.1 6.00 Casual Fine Dining Mid Full Service
## V16421.1 5.00 Casual Dining Mid Full Service
## V17018.1 1.00 Casual Fine Dining Mid Full Service
## V17172.1 2.00 Casual Fine Dining Mid Full Service
## V17378.1 1.00 Casual Fine Dining Mid Full Service
## V17542.1 NA Casual Fine Dining High Full Service
## V17579.1 2.00 Casual Fine Dining Mid Full Service
## V17581.1 NA Fast Food Mid QSR
## V20066.1 NA Casual Fine Dining High Full Service
## V20229.1 NA Casual Fine Dining Mid Full Service
## V20392.1 NA Casual Fine Dining High Full Service
## V20712.1 57.80 Casual Fine Dining Mid Full Service
## V21076.1 1.00 Casual Dining Mid Full Service
## V21651.1 NA Casual Fine Dining High Full Service
## V22165.1 4.00 Casual Fine Dining Mid Full Service
## V23435.1 NA Casual Fine Dining High Full Service
## V23462.1 NA Casual Fine Dining High Full Service
## V23912.1 NA Casual Fine Dining High Full Service
## V23946.1 NA Casual Fine Dining High Full Service
## V24843.1 5.00 Casual Fine Dining Mid Full Service
## V25315.1 12.10 Casual Dining Mid Full Service
## V25345.1 NA Casual Fine Dining High Full Service
## V28903.1 NA Casual Fine Dining High Full Service
## V30348.1 6.38 Casual Dining Mid Full Service
## V30406.1 2.00 Casual Fine Dining Mid Full Service
## V31468.1 9.74 Unknown Mid Unknown
## V31799.1 13.31 Casual Dining Mid Full Service
## V32905.1 2.86 Casual Fine Dining Mid Full Service
## V33562.1 5.72 Casual Fine Dining Mid Full Service
## V33579.1 NA Casual Dining Mid Full Service
## V34538.1 5.72 Casual Dining Mid Full Service
## V35470.1 6.40 Casual Dining Mid Full Service
## V36333.1 3.40 Casual Dining Mid Full Service
## V37120.1 4.80 Casual Dining Mid Full Service
## V37534.1 8.60 Casual Dining Mid Full Service
## V38010.1 11.11 Casual Dining Mid Full Service
## V39395.1 NA Nightclub Mid Full Service
## V39680.1 5.28 Casual Dining Mid Full Service
## V40287.1 29.48 Casual Fine Dining Mid Full Service
## V41131.1 NA Fine Dining Mid Full Service
## V42894.1 16.20 Casual Fine Dining High Full Service
## V43020.1 NA Bar Mid Full Service
## V43083.1 NA Cafe Mid Full Service
## V43089.1 NA Cafe Mid Full Service
## V43338.1 NA Cafe Mid Full Service
## V44795.1 11.00 Casual Fine Dining Mid Full Service
## V45443.1 NA Casual Dining Mid Full Service
## V45446.1 1.60 Bar Mid Full Service
## V49181 NA Casual Fine Dining High Full Service
## V49189 NA Casual Dining Mid Full Service
## V49191 NA Casual Dining Mid Full Service
## V49199 NA Casual Dining Mid Full Service
## V49446 4.00 Bar Mid Full Service
## V49575 NA Casual Fine Dining High Full Service
## V49577 NA Fine Dining High Full Service
## V50077 NA Bar Mid Full Service
## V50122 9.40 Casual Dining Mid Full Service
## V50705 6.70 Casual Dining Mid Full Service
## V50993 NA Casual Dining Mid Full Service
## V51087 28.60 Casual Fine Dining Mid Full Service
## V51404 NA Casual Dining Low Full Service
## V51407 NA Casual Dining Low Full Service
## V51414 NA Casual Fine Dining High Full Service
## V52253 5.88 Casual Dining Mid Full Service
## V52323 16.00 Casual Dining Mid Full Service
## V53028 NA Fast Casual Very Low Fast Casual
## V53445 NA Fast Casual Low Fast Casual
## V54742 10.45 Casual Dining Mid Full Service
## V55485 22.66 Casual Fine Dining Mid Full Service
## V56278 6.60 Casual Dining Mid Full Service
## V57178 NA Unknown Mid Unknown
## V57347 5.61 Casual Dining Mid Full Service
## V59250 NA Fast Casual Low Fast Casual
## V59473 NA Casual Fine Dining Mid Full Service
## V59764 11.88 Casual Dining Mid Full Service
## V60232 5.17 Casual Dining Mid Full Service
## V61034 5.17 Casual Dining Mid Full Service
## V61881 5.39 Casual Dining Mid Full Service
## V62322 NA Casual Fine Dining High Full Service
## V62325 NA Casual Fine Dining High Full Service
## V62870 31.90 Casual Fine Dining High Full Service
## V63790 5.17 Casual Dining Mid Full Service
## V64396 NA Casual Fine Dining High Full Service
## V64605 NA Casual Dining Mid QSR
## V65110 20.46 Casual Fine Dining Mid Full Service
## V65280 7.26 Casual Dining Mid Full Service
## V65389 9.77 Unknown Mid Unknown
## V65530 NA Casual Dining Mid Full Service
## V65687 6.98 Casual Dining Mid Full Service
## V65713 NA Casual Fine Dining High Full Service
## V66037 3.63 Casual Dining Mid Full Service
## V66109 NA Casual Fine Dining Mid Full Service
## V66511 25.74 Casual Dining Mid Full Service
## V66623 15.40 Casual Dining Mid Full Service
## V67536 NA Casual Dining Mid Full Service
## V68802 21.56 Casual Dining Mid Full Service
## V69003 NA Casual Fine Dining Mid Full Service
## V69024 NA Casual Fine Dining Mid Full Service
## V69049 NA Casual Fine Dining Mid Full Service
## V69087 NA Casual Fine Dining Mid Full Service
## V69230 NA Casual Fine Dining Mid Full Service
## V69250 NA Casual Fine Dining Mid Full Service
## V69258 NA Casual Fine Dining Mid Full Service
## V69653 5.39 Casual Dining Mid Full Service
## V69710 NA Casual Fine Dining Mid Full Service
## V69711 NA Casual Fine Dining Mid Full Service
## V69914 NA Casual Fine Dining Mid Full Service
## V70272 14.30 Casual Dining Mid Full Service
## V70640 5.83 Casual Dining Mid Full Service
## V70922 NA Casual Fine Dining Mid Full Service
## V70983 NA Casual Fine Dining High Full Service
## V71026 32.34 Casual Fine Dining Mid Full Service
## V71091 NA Casual Fine Dining Mid Full Service
## V71146 NA Casual Fine Dining Mid Full Service
## V71156 NA Casual Fine Dining Mid Full Service
## V71305 0.75 Casual Fine Dining High Full Service
## V71362 NA Casual Fine Dining High Full Service
## V71363 NA Casual Fine Dining Mid Full Service
## V71364 NA Casual Fine Dining Mid Full Service
## V71601 NA Casual Fine Dining Mid Full Service
## V71632 NA Casual Fine Dining High Full Service
## V71859 NA Casual Fine Dining High Full Service
## V71884 NA Casual Fine Dining High Full Service
## V71889 NA Casual Fine Dining High Full Service
## V71893 NA Casual Fine Dining High Full Service
## V72240 15.29 Casual Dining Mid Full Service
## V72467 9.02 Casual Fine Dining Mid Full Service
## V73195 NA Fine Dining High Full Service
## V73221 NA Casual Fine Dining Mid Full Service
## V73454 NA Casual Fine Dining Mid Full Service
## V73881 5.61 Casual Dining Mid Full Service
## V74912 6.82 Casual Dining Mid Full Service
## V75202 NA Bar Mid Full Service
## V75411 NA Casual Fine Dining Mid Full Service
## V75645 NA Casual Dining Mid Full Service
## V75673 NA Casual Dining Low Full Service
## V76319 12.98 Casual Dining Mid Full Service
## V76898 5.39 Casual Dining Mid Full Service
## V77372 1.00 Casual Fine Dining Mid Full Service
## V77678 4.00 Casual Fine Dining High Full Service
## V77681 NA Casual Fine Dining High Full Service
## V78488 24.64 Casual Dining Mid Full Service
## V79097 28.38 Casual Fine Dining Mid Full Service
## V79686 NA Casual Fine Dining High Full Service
## V79689 NA Casual Fine Dining High Full Service
## V79708 4.18 Casual Fine Dining High Full Service
## V79709 2.00 Casual Fine Dining High Full Service
## V79710 4.62 Fine Dining High Full Service
## V82593 3.80 Fine Dining High Full Service
## V83294 5.39 Casual Dining Mid Full Service
## V85065 3.74 Casual Dining Mid Full Service
## V85068 2.64 Casual Dining Mid Full Service
## V85423 3.08 Casual Dining Mid Full Service
## V90361 3.08 Casual Fine Dining Mid Full Service
## V95175 5.39 Casual Dining Mid Full Service
## V95537 3.30 Casual Dining Mid Full Service
## V99168 NA Fine Dining High Full Service
## V99195 3.08 Fine Dining High Full Service
## V99453 25.96 Casual Fine Dining Mid Full Service
## V99523 NA Casual Dining Mid QSR
## V103198 1.00 Cafe High Full Service
## V104057 1.00 Cafe High Full Service
## V104072 2.20 Cafe High Full Service
## V104163 1.00 Casual Dining Mid Full Service
## V104239 3.96 Bar Mid Full Service
## V104240 3.52 Fine Dining High Full Service
## V104340 1.00 Casual Dining Mid Full Service
## V104748 1.00 Casual Dining Mid Full Service
## V106109 7.81 Casual Dining Mid Full Service
## V108449 6.27 Casual Dining Mid Full Service
## V692.2 9.57 Casual Dining Mid Full Service
## V1406.2 1.00 Nightclub Mid Full Service
## V3753.2 14.16 Casual Dining Mid Full Service
## V4849.2 5.39 Casual Dining Mid Full Service
## V6154.2 2.00 Casual Fine Dining High Full Service
## V8535.2 6.61 Casual Dining Mid Full Service
## V10361.2 13.75 Casual Dining Mid Full Service
## V11059.2 4.93 Casual Fine Dining Mid Full Service
## V11529.2 2.95 Casual Dining Mid Full Service
## V16777.2 1.00 Casual Fine Dining Mid Full Service
## V16780.2 1.00 Casual Fine Dining Mid Full Service
## V16794.2 1.00 Fine Dining Mid Full Service
## V16812.2 1.00 Casual Fine Dining Mid Full Service
## V16813.2 1.00 Casual Fine Dining Mid Full Service
## V16909.2 0.67 Casual Fine Dining High Full Service
## V16910.2 3.08 Casual Fine Dining High Full Service
## V16911.2 2.00 Casual Fine Dining High Full Service
## V16946.2 1.00 Casual Fine Dining Mid Full Service
## V16947.2 1.00 Casual Fine Dining Mid Full Service
## V16949.2 1.00 Casual Fine Dining Mid Full Service
## V17268.2 5.70 Casual Dining Very Low Full Service
## V18530.2 17.49 Casual Dining Mid Full Service
## V20523.2 1.00 Casual Dining Mid Full Service
filter(df_users_thru_jan23, user_id == "63193")
## user_id account_created_at zip_code user_app_version user_app_platform
## V48396 63193 2021-11-01 21:11:40 <NA> 6.4.17.470 ios
user_id: 70266filter(df_revenue_view, user_id == "70266")
## UID name project_id gcp_id ict_id
## V9397.1 82836g Citizens Manhattan West 722 82836 <NA>
## V35927 113231g Citizens Manhattan West 722 113231 <NA>
## V38356 i22186 inKind Pass -999 <NA> 22186
## created_at amount_charged_in_usd utm_campaign utm_medium
## V9397.1 2022-04-05 22:45:41 500.00 <NA> <NA>
## V35927 2022-09-28 16:37:40 8.14 <NA> <NA>
## V38356 2022-10-11 14:01:08 499.00 <NA> <NA>
## utm_content utm_source is_app_purchase user_id transaction_type
## V9397.1 <NA> <NA> 1 70266 1
## V35927 <NA> <NA> 0 70266 1
## V38356 <NA> <NA> 1 70266 1
## credit_type credit_given_in_usd is_excess stripe_brand option_id
## V9397.1 0 600.00 <NA> American Express 16121
## V35927 0 8.14 1 American Express 35241
## V38356 0 675.00 <NA> <NA> 61
filter(df_redemptions, user_id == "70266")
## user_id created_at project_id project.name
## V21631.1 70266 2022-04-18 11:41:50 722 Citizens Manhattan West
## V21755.1 70266 2022-04-19 07:12:59 699 Bluestone Lane
## V21790.1 70266 2022-04-19 12:41:43 722 Citizens Manhattan West
## V21913.1 70266 2022-04-20 08:01:14 699 Bluestone Lane
## V21934.1 70266 2022-04-20 11:58:03 722 Citizens Manhattan West
## V22142.1 70266 2022-04-21 12:14:39 722 Citizens Manhattan West
## V23260.1 70266 2022-04-25 08:26:10 699 Bluestone Lane
## V23278.1 70266 2022-04-25 12:22:29 722 Citizens Manhattan West
## V23397.1 70266 2022-04-26 07:09:29 699 Bluestone Lane
## V23424.1 70266 2022-04-26 11:51:01 722 Citizens Manhattan West
## V23585.1 70266 2022-04-27 07:54:38 699 Bluestone Lane
## V23638.1 70266 2022-04-27 12:51:53 722 Citizens Manhattan West
## V23845.1 70266 2022-04-28 07:47:00 699 Bluestone Lane
## V23874.1 70266 2022-04-28 11:53:43 722 Citizens Manhattan West
## V25553.1 70266 2022-05-02 07:38:29 699 Bluestone Lane
## V25572.1 70266 2022-05-02 11:49:38 722 Citizens Manhattan West
## V25722.1 70266 2022-05-03 07:41:28 699 Bluestone Lane
## V25746.1 70266 2022-05-03 11:43:27 722 Citizens Manhattan West
## V25962.1 70266 2022-05-04 07:48:43 699 Bluestone Lane
## V25979.1 70266 2022-05-04 11:37:28 722 Citizens Manhattan West
## V26230.1 70266 2022-05-05 07:45:56 699 Bluestone Lane
## V26252.1 70266 2022-05-05 12:03:07 722 Citizens Manhattan West
## V27817.1 70266 2022-05-09 07:23:09 699 Bluestone Lane
## V28016.1 70266 2022-05-10 07:45:17 699 Bluestone Lane
## V28047.1 70266 2022-05-10 11:54:12 722 Citizens Manhattan West
## V28270.1 70266 2022-05-11 07:59:00 699 Bluestone Lane
## V28539.1 70266 2022-05-12 07:51:52 699 Bluestone Lane
## V36902.1 70266 2022-06-01 12:55:32 722 Citizens Manhattan West
## V37104.1 70266 2022-06-02 08:25:24 699 Bluestone Lane
## V37143.1 70266 2022-06-02 12:49:24 722 Citizens Manhattan West
## V38331.1 70266 2022-06-06 14:10:28 722 Citizens Manhattan West
## V38436.1 70266 2022-06-07 07:53:50 699 Bluestone Lane
## V38628.1 70266 2022-06-08 07:57:35 699 Bluestone Lane
## V38665.1 70266 2022-06-08 12:14:13 722 Citizens Manhattan West
## V40350.1 70266 2022-06-13 07:45:08 699 Bluestone Lane
## V40379.1 70266 2022-06-13 12:25:30 722 Citizens Manhattan West
## V40555.1 70266 2022-06-14 07:52:53 699 Bluestone Lane
## V42778.1 70266 2022-06-21 12:44:28 722 Citizens Manhattan West
## V45156.1 70266 2022-06-28 12:58:00 722 Citizens Manhattan West
## V45758.1 70266 2022-06-30 12:10:37 722 Citizens Manhattan West
## V47546 70266 2022-07-06 13:39:22 722 Citizens Manhattan West
## V49546 70266 2022-07-13 11:45:17 722 Citizens Manhattan West
## V50952 70266 2022-07-18 11:45:05 722 Citizens Manhattan West
## V53187 70266 2022-07-26 11:55:36 722 Citizens Manhattan West
## V53471 70266 2022-07-27 12:45:50 722 Citizens Manhattan West
## V55022 70266 2022-08-01 12:29:55 722 Citizens Manhattan West
## V55185 70266 2022-08-02 12:34:31 722 Citizens Manhattan West
## V60464 70266 2022-08-22 13:32:46 722 Citizens Manhattan West
## V65674 70266 2022-09-13 11:27:18 722 Citizens Manhattan West
## V67812 70266 2022-09-22 14:55:11 699 Bluestone Lane
## V69474 70266 2022-09-28 12:37:43 722 Citizens Manhattan West
## V75185 70266 2022-10-18 14:48:33 699 Bluestone Lane
## V77659 70266 2022-10-27 13:00:14 722 Citizens Manhattan West
## V80038 70266 2022-11-03 11:54:45 722 Citizens Manhattan West
## V82205 70266 2022-11-08 10:11:43 699 Bluestone Lane
## V82246 70266 2022-11-08 12:26:55 722 Citizens Manhattan West
## V82543 70266 2022-11-09 11:20:49 722 Citizens Manhattan West
## V85819 70266 2022-11-16 09:50:36 699 Bluestone Lane
## V89824 70266 2022-11-21 12:02:48 722 Citizens Manhattan West
## V94247 70266 2022-11-28 13:13:49 722 Citizens Manhattan West
## V98654 70266 2022-12-05 10:27:46 699 Bluestone Lane
## V103163 70266 2022-12-12 14:22:43 722 Citizens Manhattan West
## V7123.2 70266 2023-01-12 12:48:00 699 Bluestone Lane
## V10957.2 70266 2023-01-17 12:15:13 699 Bluestone Lane
## V16202.2 70266 2023-01-25 10:41:33 699 Bluestone Lane
## V16726.2 70266 2023-01-26 10:38:05 699 Bluestone Lane
## V17396.2 70266 2023-01-27 11:05:37 699 Bluestone Lane
## V20339.2 70266 2023-01-30 10:22:55 699 Bluestone Lane
## Location project_location_id city state
## V21631.1 El Pollo Verde 3374 New York NY
## V21755.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V21790.1 El Pollo Verde 3374 New York NY
## V21913.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V21934.1 El Pollo Verde 3374 New York NY
## V22142.1 El Pollo Verde 3374 New York NY
## V23260.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V23278.1 El Pollo Verde 3374 New York NY
## V23397.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V23424.1 El Pollo Verde 3374 New York NY
## V23585.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V23638.1 El Pollo Verde 3374 New York NY
## V23845.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V23874.1 El Pollo Verde 3374 New York NY
## V25553.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V25572.1 El Pollo Verde 3374 New York NY
## V25722.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V25746.1 El Pollo Verde 3374 New York NY
## V25962.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V25979.1 El Pollo Verde 3374 New York NY
## V26230.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V26252.1 El Pollo Verde 3374 New York NY
## V27817.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V28016.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V28047.1 El Pollo Verde 3374 New York NY
## V28270.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V28539.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V36902.1 El Pollo Verde 3374 New York NY
## V37104.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V37143.1 El Pollo Verde 3374 New York NY
## V38331.1 El Pollo Verde 3374 New York NY
## V38436.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V38628.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V38665.1 El Pollo Verde 3374 New York NY
## V40350.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V40379.1 El Pollo Verde 3374 New York NY
## V40555.1 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V42778.1 El Pollo Verde 3374 New York NY
## V45156.1 El Pollo Verde 3374 New York NY
## V45758.1 El Pollo Verde 3374 New York NY
## V47546 El Pollo Verde 3374 New York NY
## V49546 El Pollo Verde 3374 New York NY
## V50952 El Pollo Verde 3374 New York NY
## V53187 El Pollo Verde 3374 New York NY
## V53471 El Pollo Verde 3374 New York NY
## V55022 El Pollo Verde 3374 New York NY
## V55185 El Pollo Verde 3374 New York NY
## V60464 El Pollo Verde 3374 New York NY
## V65674 El Pollo Verde 3374 New York NY
## V67812 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V69474 Plant Nation 3369 New York NY
## V75185 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V77659 Plant Nation 3369 New York NY
## V80038 Plant Nation 3369 New York NY
## V82205 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V82246 Plant Nation 3369 New York NY
## V82543 Plant Nation 3369 New York NY
## V85819 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V89824 Soom Soom 3370 New York NY
## V94247 Plant Nation 3369 New York NY
## V98654 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V103163 Plant Nation 3369 New York NY
## V7123.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V10957.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V16202.2 Bluestone Lane (Hudson Yards) 3174 New York NY
## V16726.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V17396.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## V20339.2 Bluestone Lane (30 Hudson Yards) 4544 New York NY
## credit_transaction_id total_redemption_amount tip Venue.Type...Detail
## V21631.1 459695 18.51 1.00 Fast Casual
## V21755.1 460020 4.08 0.68 Coffee Shop
## V21790.1 460066 18.51 1.00 Fast Casual
## V21913.1 460396 4.08 0.68 Coffee Shop
## V21934.1 460430 17.96 1.00 Fast Casual
## V22142.1 460885 18.51 NA Fast Casual
## V23260.1 463012 4.08 0.68 Coffee Shop
## V23278.1 463040 18.51 NA Fast Casual
## V23397.1 463350 4.08 0.56 Coffee Shop
## V23424.1 463398 18.51 NA Fast Casual
## V23585.1 463797 4.08 0.56 Coffee Shop
## V23638.1 465176 18.51 NA Fast Casual
## V23845.1 468688 4.08 0.53 Coffee Shop
## V23874.1 468935 18.51 NA Fast Casual
## V25553.1 472986 4.08 0.56 Coffee Shop
## V25572.1 473036 17.96 NA Fast Casual
## V25722.1 473452 4.08 0.56 Coffee Shop
## V25746.1 474354 18.51 NA Fast Casual
## V25962.1 475412 4.08 0.68 Coffee Shop
## V25979.1 475496 18.51 NA Fast Casual
## V26230.1 477533 4.08 0.56 Coffee Shop
## V26252.1 477601 18.51 1.00 Fast Casual
## V27817.1 480963 4.08 0.56 Coffee Shop
## V28016.1 485011 4.08 0.56 Coffee Shop
## V28047.1 485193 18.51 1.00 Fast Casual
## V28270.1 486576 4.08 0.56 Coffee Shop
## V28539.1 487432 4.08 0.56 Coffee Shop
## V36902.1 512700 20.69 NA Fast Casual
## V37104.1 513144 4.08 0.56 Coffee Shop
## V37143.1 513194 20.69 NA Fast Casual
## V38331.1 515384 20.69 NA Fast Casual
## V38436.1 515621 4.08 0.56 Coffee Shop
## V38628.1 516018 5.77 0.74 Coffee Shop
## V38665.1 516066 20.69 NA Fast Casual
## V40350.1 520202 5.77 0.80 Coffee Shop
## V40379.1 520278 20.69 NA Fast Casual
## V40555.1 520758 4.08 0.60 Coffee Shop
## V42778.1 525678 20.69 NA Fast Casual
## V45156.1 531106 20.69 NA Fast Casual
## V45758.1 532434 20.69 NA Fast Casual
## V47546 536152 20.69 NA Fast Casual
## V49546 540254 20.69 NA Fast Casual
## V50952 542931 20.69 NA Fast Casual
## V53187 547441 20.69 NA Fast Casual
## V53471 547971 20.69 NA Fast Casual
## V55022 551011 20.69 NA Fast Casual
## V55185 551326 20.69 NA Fast Casual
## V60464 561405 20.69 NA Fast Casual
## V65674 571406 20.69 NA Fast Casual
## V67812 575350 4.08 0.56 Coffee Shop
## V69474 578577 16.88 NA Fast Food
## V75185 589149 10.83 1.00 Coffee Shop
## V77659 593790 17.42 NA Fast Food
## V80038 598338 14.81 NA Fast Food
## V82205 602778 10.62 0.98 Coffee Shop
## V82246 602860 14.35 NA Fast Food
## V82543 603496 12.96 NA Fast Food
## V85819 610671 10.62 0.98 Coffee Shop
## V89824 620220 20.69 NA Casual Dining
## V94247 631280 16.88 NA Fast Food
## V98654 641440 10.62 0.98 Coffee Shop
## V103163 651875 13.88 NA Fast Food
## V7123.2 702624 12.52 0.92 Coffee Shop
## V10957.2 711114 12.52 0.92 Coffee Shop
## V16202.2 722949 10.62 0.98 Coffee Shop
## V16726.2 724107 10.62 0.98 Coffee Shop
## V17396.2 725496 12.52 0.92 Coffee Shop
## V20339.2 732239 10.62 0.98 Coffee Shop
## Check.Average Service.Type
## V21631.1 Mid QSR
## V21755.1 Very Low QSR
## V21790.1 Mid QSR
## V21913.1 Very Low QSR
## V21934.1 Mid QSR
## V22142.1 Mid QSR
## V23260.1 Very Low QSR
## V23278.1 Mid QSR
## V23397.1 Very Low QSR
## V23424.1 Mid QSR
## V23585.1 Very Low QSR
## V23638.1 Mid QSR
## V23845.1 Very Low QSR
## V23874.1 Mid QSR
## V25553.1 Very Low QSR
## V25572.1 Mid QSR
## V25722.1 Very Low QSR
## V25746.1 Mid QSR
## V25962.1 Very Low QSR
## V25979.1 Mid QSR
## V26230.1 Very Low QSR
## V26252.1 Mid QSR
## V27817.1 Very Low QSR
## V28016.1 Very Low QSR
## V28047.1 Mid QSR
## V28270.1 Very Low QSR
## V28539.1 Very Low QSR
## V36902.1 Mid QSR
## V37104.1 Very Low QSR
## V37143.1 Mid QSR
## V38331.1 Mid QSR
## V38436.1 Very Low QSR
## V38628.1 Very Low QSR
## V38665.1 Mid QSR
## V40350.1 Very Low QSR
## V40379.1 Mid QSR
## V40555.1 Very Low QSR
## V42778.1 Mid QSR
## V45156.1 Mid QSR
## V45758.1 Mid QSR
## V47546 Mid QSR
## V49546 Mid QSR
## V50952 Mid QSR
## V53187 Mid QSR
## V53471 Mid QSR
## V55022 Mid QSR
## V55185 Mid QSR
## V60464 Mid QSR
## V65674 Mid QSR
## V67812 Very Low QSR
## V69474 Mid QSR
## V75185 Very Low QSR
## V77659 Mid QSR
## V80038 Mid QSR
## V82205 Very Low QSR
## V82246 Mid QSR
## V82543 Mid QSR
## V85819 Very Low QSR
## V89824 Mid QSR
## V94247 Mid QSR
## V98654 Very Low QSR
## V103163 Mid QSR
## V7123.2 Very Low QSR
## V10957.2 Very Low QSR
## V16202.2 Very Low QSR
## V16726.2 Very Low QSR
## V17396.2 Very Low QSR
## V20339.2 Very Low QSR
filter(df_users_thru_jan23, user_id == "70266")
## user_id account_created_at zip_code user_app_version user_app_platform
## V51167 70266 2021-11-29 14:29:28 <NA> 6.4.13.422 ios
[1] Z. Jiang, “RPubs - Exploratory Data Analysis VIII - Daily Panel Data Frame with Marketing Campaigns and Time-varying Variables,” rpubs.com, Jul. 11, 2023. https://rpubs.com/jiangzm/1062411 (accessed Jul. 17, 2023).
[2] Z. Jiang, “RPubs - Exploratory Data Analysis IV - Further Revision on Redemptions and Revenue,” rpubs.com, May 17, 2023. https://rpubs.com/jiangzm/1044338 (accessed Jul. 17, 2023).
[3] Z. Jiang, “RPubs - Exploratory Data Analysis,” rpubs.com, May 02, 2023. https://rpubs.com/jiangzm/1038075 (accessed Jul. 17, 2023).